DAMASK_EICMD/src/material.f90

935 lines
45 KiB
Fortran
Raw Normal View History

!--------------------------------------------------------------------------------------------------
!> @author Franz Roters, Max-Planck-Institut für Eisenforschung GmbH
!> @author Philip Eisenlohr, Max-Planck-Institut für Eisenforschung GmbH
2018-06-26 22:39:46 +05:30
!> @author Martin Diehl, Max-Planck-Institut für Eisenforschung GmbH
!> @brief Parses material config file, either solverJobName.materialConfig or material.config
!> @details reads the material configuration file, where solverJobName.materialConfig takes
!! precedence over material.config and parses the sections 'homogenization', 'crystallite',
!! 'phase', 'texture', and 'microstucture'
!--------------------------------------------------------------------------------------------------
module material
2019-05-09 01:56:14 +05:30
use prec
use math
use config
implicit none
private
2013-12-16 16:26:56 +05:30
character(len=*), parameter, public :: &
ELASTICITY_hooke_label = 'hooke', &
PLASTICITY_none_label = 'none', &
PLASTICITY_isotropic_label = 'isotropic', &
PLASTICITY_phenopowerlaw_label = 'phenopowerlaw', &
PLASTICITY_kinehardening_label = 'kinehardening', &
2015-05-29 16:33:25 +05:30
PLASTICITY_dislotwin_label = 'dislotwin', &
PLASTICITY_disloucla_label = 'disloucla', &
PLASTICITY_nonlocal_label = 'nonlocal', &
SOURCE_thermal_dissipation_label = 'thermal_dissipation', &
SOURCE_thermal_externalheat_label = 'thermal_externalheat', &
SOURCE_damage_isoBrittle_label = 'damage_isobrittle', &
SOURCE_damage_isoDuctile_label = 'damage_isoductile', &
SOURCE_damage_anisoBrittle_label = 'damage_anisobrittle', &
SOURCE_damage_anisoDuctile_label = 'damage_anisoductile', &
KINEMATICS_thermal_expansion_label = 'thermal_expansion', &
KINEMATICS_cleavage_opening_label = 'cleavage_opening', &
KINEMATICS_slipplane_opening_label = 'slipplane_opening', &
STIFFNESS_DEGRADATION_damage_label = 'damage', &
THERMAL_isothermal_label = 'isothermal', &
THERMAL_adiabatic_label = 'adiabatic', &
THERMAL_conduction_label = 'conduction', &
DAMAGE_none_label = 'none', &
DAMAGE_local_label = 'local', &
DAMAGE_nonlocal_label = 'nonlocal', &
HOMOGENIZATION_none_label = 'none', &
HOMOGENIZATION_isostrain_label = 'isostrain', &
2015-10-14 00:22:01 +05:30
HOMOGENIZATION_rgc_label = 'rgc'
2013-11-27 13:35:23 +05:30
2015-10-14 00:22:01 +05:30
enum, bind(c)
enumerator :: ELASTICITY_undefined_ID, &
2019-05-01 02:36:16 +05:30
ELASTICITY_hooke_ID, &
PLASTICITY_undefined_ID, &
PLASTICITY_none_ID, &
PLASTICITY_isotropic_ID, &
2013-11-27 13:35:23 +05:30
PLASTICITY_phenopowerlaw_ID, &
PLASTICITY_kinehardening_ID, &
2013-11-27 13:35:23 +05:30
PLASTICITY_dislotwin_ID, &
2015-01-15 16:26:15 +05:30
PLASTICITY_disloucla_ID, &
2019-05-01 02:36:16 +05:30
PLASTICITY_nonlocal_ID, &
SOURCE_undefined_ID, &
SOURCE_thermal_dissipation_ID, &
SOURCE_thermal_externalheat_ID, &
SOURCE_damage_isoBrittle_ID, &
SOURCE_damage_isoDuctile_ID, &
SOURCE_damage_anisoBrittle_ID, &
2019-05-01 02:36:16 +05:30
SOURCE_damage_anisoDuctile_ID, &
KINEMATICS_undefined_ID, &
KINEMATICS_cleavage_opening_ID, &
KINEMATICS_slipplane_opening_ID, &
2019-05-01 02:36:16 +05:30
KINEMATICS_thermal_expansion_ID, &
STIFFNESS_DEGRADATION_undefined_ID, &
STIFFNESS_DEGRADATION_damage_ID, &
THERMAL_isothermal_ID, &
THERMAL_adiabatic_ID, &
2019-05-01 02:36:16 +05:30
THERMAL_conduction_ID, &
DAMAGE_none_ID, &
DAMAGE_local_ID, &
2019-05-01 02:36:16 +05:30
DAMAGE_nonlocal_ID, &
HOMOGENIZATION_undefined_ID, &
HOMOGENIZATION_none_ID, &
HOMOGENIZATION_isostrain_ID, &
HOMOGENIZATION_rgc_ID
2013-11-27 13:35:23 +05:30
end enum
integer(kind(ELASTICITY_undefined_ID)), dimension(:), allocatable, public, protected :: &
2015-10-14 00:22:01 +05:30
phase_elasticity !< elasticity of each phase
integer(kind(PLASTICITY_undefined_ID)), dimension(:), allocatable, public, protected :: &
2015-10-14 00:22:01 +05:30
phase_plasticity !< plasticity of each phase
integer(kind(THERMAL_isothermal_ID)), dimension(:), allocatable, public, protected :: &
2015-10-14 00:22:01 +05:30
thermal_type !< thermal transport model
integer(kind(DAMAGE_none_ID)), dimension(:), allocatable, public, protected :: &
2015-10-14 00:22:01 +05:30
damage_type !< nonlocal damage model
integer(kind(SOURCE_undefined_ID)), dimension(:,:), allocatable, public, protected :: &
phase_source, & !< active sources mechanisms of each phase
2015-10-14 00:22:01 +05:30
phase_kinematics, & !< active kinematic mechanisms of each phase
phase_stiffnessDegradation !< active stiffness degradation mechanisms of each phase
integer(kind(HOMOGENIZATION_undefined_ID)), dimension(:), allocatable, public, protected :: &
2013-11-27 13:35:23 +05:30
homogenization_type !< type of each homogenization
2019-05-15 02:14:38 +05:30
integer, public, protected :: &
homogenization_maxNgrains !< max number of grains in any USED homogenization
2015-10-14 00:22:01 +05:30
2019-05-15 02:14:38 +05:30
integer, dimension(:), allocatable, public, protected :: &
phase_Nsources, & !< number of source mechanisms active in each phase
phase_Nkinematics, & !< number of kinematic mechanisms active in each phase
phase_NstiffnessDegradations, & !< number of stiffness degradation mechanisms active in each phase
phase_Noutput, & !< number of '(output)' items per phase
phase_elasticityInstance, & !< instance of particular elasticity of each phase
phase_plasticityInstance, & !< instance of particular plasticity of each phase
crystallite_Noutput, & !< number of '(output)' items per crystallite setting
homogenization_Ngrains, & !< number of grains in each homogenization
homogenization_Noutput, & !< number of '(output)' items per homogenization
homogenization_typeInstance, & !< instance of particular type of each homogenization
thermal_typeInstance, & !< instance of particular type of each thermal transport
damage_typeInstance, & !< instance of particular type of each nonlocal damage
microstructure_crystallite !< crystallite setting ID of each microstructure ! DEPRECATED !!!!
real(pReal), dimension(:), allocatable, public, protected :: &
2015-10-14 00:22:01 +05:30
thermal_initialT, & !< initial temperature per each homogenization
2018-12-30 15:11:11 +05:30
damage_initialPhi !< initial damage per each homogenization
! NEW MAPPINGS
2019-04-04 16:55:29 +05:30
integer, dimension(:), allocatable, public, protected :: & ! (elem)
material_homogenizationAt !< homogenization ID of each element (copy of mesh_homogenizationAt)
integer, dimension(:,:), allocatable, public, protected :: & ! (ip,elem)
material_homogenizationMemberAt !< position of the element within its homogenization instance
integer, dimension(:,:), allocatable, public, protected :: & ! (constituent,elem)
material_phaseAt !< phase ID of each element
integer, dimension(:,:,:), allocatable, public, protected :: & ! (constituent,ip,elem)
material_phaseMemberAt !< position of the element within its phase instance
! END NEW MAPPINGS
! DEPRECATED: use material_phaseAt
2019-05-15 02:14:38 +05:30
integer, dimension(:,:,:), allocatable, public :: &
material_phase !< phase (index) of each grain,IP,element
type(tPlasticState), allocatable, dimension(:), public :: &
plasticState
type(tSourceState), allocatable, dimension(:), public :: &
sourceState
type(tState), allocatable, dimension(:), public :: &
homogState, &
thermalState, &
2018-12-30 15:11:11 +05:30
damageState
2019-05-15 02:14:38 +05:30
integer, dimension(:,:,:), allocatable, public, protected :: &
material_texture !< texture (index) of each grain,IP,element
2015-10-14 00:22:01 +05:30
2013-12-16 16:26:56 +05:30
real(pReal), dimension(:,:,:,:), allocatable, public, protected :: &
material_EulerAngles !< initial orientation of each grain,IP,element
2015-10-14 00:22:01 +05:30
2013-12-16 16:26:56 +05:30
logical, dimension(:), allocatable, public, protected :: &
2015-10-14 00:22:01 +05:30
microstructure_active, &
phase_localPlasticity !< flags phases with local constitutive law
2019-05-15 02:14:38 +05:30
integer, private :: &
microstructure_maxNconstituents, & !< max number of constituents in any phase
2019-05-04 17:49:27 +05:30
texture_maxNgauss !< max number of Gauss components in any texture
2019-05-15 02:14:38 +05:30
integer, dimension(:), allocatable, private :: &
microstructure_Nconstituents, & !< number of constituents in each microstructure
2019-05-04 17:49:27 +05:30
texture_Ngauss !< number of Gauss components per texture
2015-10-14 00:22:01 +05:30
2019-05-15 02:14:38 +05:30
integer, dimension(:,:), allocatable, private :: &
microstructure_phase, & !< phase IDs of each microstructure
microstructure_texture !< texture IDs of each microstructure
2015-10-14 00:22:01 +05:30
2013-12-16 16:26:56 +05:30
real(pReal), dimension(:,:), allocatable, private :: &
microstructure_fraction !< vol fraction of each constituent in microstructure
2015-10-14 00:22:01 +05:30
2013-12-16 16:26:56 +05:30
real(pReal), dimension(:,:,:), allocatable, private :: &
texture_Gauss, & !< data of each Gauss component
texture_transformation !< transformation for each texture
2015-10-14 00:22:01 +05:30
2013-12-16 16:26:56 +05:30
logical, dimension(:), allocatable, private :: &
homogenization_active
2015-10-14 00:22:01 +05:30
! BEGIN DEPRECATED
2019-05-15 02:14:38 +05:30
integer, dimension(:,:,:), allocatable, public :: phaseAt !< phase ID of every material point (ipc,ip,el)
integer, dimension(:,:,:), allocatable, public :: phasememberAt !< memberID of given phase at every material point (ipc,ip,el)
2019-05-15 02:14:38 +05:30
integer, dimension(:,:,:), allocatable, public, target :: mappingHomogenization !< mapping from material points to offset in heterogenous state/field
integer, dimension(:,:), allocatable, private, target :: mappingHomogenizationConst !< mapping from material points to offset in constant state/field
! END DEPRECATED
2015-10-14 00:22:01 +05:30
type(tHomogMapping), allocatable, dimension(:), public :: &
thermalMapping, & !< mapping for thermal state/fields
2018-12-30 15:11:11 +05:30
damageMapping !< mapping for damage state/fields
2015-10-14 00:22:01 +05:30
type(group_float), allocatable, dimension(:), public :: &
temperature, & !< temperature field
damage, & !< damage field
2018-12-22 13:30:57 +05:30
temperatureRate !< temperature change rate field
public :: &
2013-11-27 13:35:23 +05:30
material_init, &
material_allocatePlasticState, &
2019-02-13 11:52:37 +05:30
material_allocateSourceState, &
2013-12-16 16:26:56 +05:30
ELASTICITY_hooke_ID ,&
2013-11-27 13:35:23 +05:30
PLASTICITY_none_ID, &
PLASTICITY_isotropic_ID, &
2013-11-27 13:35:23 +05:30
PLASTICITY_phenopowerlaw_ID, &
PLASTICITY_kinehardening_ID, &
2013-11-27 13:35:23 +05:30
PLASTICITY_dislotwin_ID, &
2015-01-15 16:26:15 +05:30
PLASTICITY_disloucla_ID, &
2013-11-27 13:35:23 +05:30
PLASTICITY_nonlocal_ID, &
SOURCE_thermal_dissipation_ID, &
SOURCE_thermal_externalheat_ID, &
SOURCE_damage_isoBrittle_ID, &
SOURCE_damage_isoDuctile_ID, &
SOURCE_damage_anisoBrittle_ID, &
SOURCE_damage_anisoDuctile_ID, &
KINEMATICS_cleavage_opening_ID, &
KINEMATICS_slipplane_opening_ID, &
KINEMATICS_thermal_expansion_ID, &
STIFFNESS_DEGRADATION_damage_ID, &
THERMAL_isothermal_ID, &
THERMAL_adiabatic_ID, &
THERMAL_conduction_ID, &
DAMAGE_none_ID, &
DAMAGE_local_ID, &
DAMAGE_nonlocal_ID, &
HOMOGENIZATION_none_ID, &
2013-11-27 13:35:23 +05:30
HOMOGENIZATION_isostrain_ID, &
HOMOGENIZATION_RGC_ID
private :: &
material_parseHomogenization, &
material_parseMicrostructure, &
material_parseCrystallite, &
material_parsePhase, &
material_parseTexture, &
material_populateGrains
contains
!--------------------------------------------------------------------------------------------------
!> @brief parses material configuration file
2015-10-14 00:22:01 +05:30
!> @details figures out if solverJobName.materialConfig is present, if not looks for
!> material.config
!--------------------------------------------------------------------------------------------------
2019-04-04 16:55:29 +05:30
subroutine material_init
#if defined(PETSc) || defined(DAMASK_HDF5)
use results
#endif
use IO, only: &
2019-03-09 12:17:01 +05:30
IO_error
use debug, only: &
debug_level, &
debug_material, &
debug_levelBasic, &
debug_levelExtensive
use mesh, only: &
2019-02-02 16:45:05 +05:30
theMesh
2015-10-14 00:22:01 +05:30
2019-05-15 02:14:38 +05:30
integer, parameter :: FILEUNIT = 210
integer :: m,c,h, myDebug, myPhase, myHomog
integer :: &
g, & !< grain number
i, & !< integration point number
e !< element number
2019-05-15 02:14:38 +05:30
integer, dimension(:), allocatable :: &
CounterPhase, &
CounterHomogenization
myDebug = debug_level(debug_material)
2015-10-14 00:22:01 +05:30
write(6,'(/,a)') ' <<<+- material init -+>>>'
2018-06-11 03:46:48 +05:30
call material_parsePhase()
2019-05-15 02:14:38 +05:30
if (iand(myDebug,debug_levelBasic) /= 0) write(6,'(a)') ' Phase parsed'; flush(6)
2018-06-11 03:46:48 +05:30
call material_parseMicrostructure()
2019-05-15 02:14:38 +05:30
if (iand(myDebug,debug_levelBasic) /= 0) write(6,'(a)') ' Microstructure parsed'; flush(6)
2018-06-11 03:46:48 +05:30
call material_parseCrystallite()
2019-05-15 02:14:38 +05:30
if (iand(myDebug,debug_levelBasic) /= 0) write(6,'(a)') ' Crystallite parsed'; flush(6)
2018-06-11 03:46:48 +05:30
call material_parseHomogenization()
2019-05-15 02:14:38 +05:30
if (iand(myDebug,debug_levelBasic) /= 0) write(6,'(a)') ' Homogenization parsed'; flush(6)
2018-06-11 03:46:48 +05:30
call material_parseTexture()
2019-05-15 02:14:38 +05:30
if (iand(myDebug,debug_levelBasic) /= 0) write(6,'(a)') ' Texture parsed'; flush(6)
2018-06-27 00:24:54 +05:30
allocate(plasticState (size(config_phase)))
allocate(sourceState (size(config_phase)))
do myPhase = 1,size(config_phase)
allocate(sourceState(myPhase)%p(phase_Nsources(myPhase)))
2015-10-14 00:22:01 +05:30
enddo
2018-06-27 00:24:54 +05:30
allocate(homogState (size(config_homogenization)))
allocate(thermalState (size(config_homogenization)))
allocate(damageState (size(config_homogenization)))
allocate(thermalMapping (size(config_homogenization)))
allocate(damageMapping (size(config_homogenization)))
allocate(temperature (size(config_homogenization)))
allocate(damage (size(config_homogenization)))
allocate(temperatureRate (size(config_homogenization)))
2019-05-15 02:14:38 +05:30
do m = 1,size(config_microstructure)
if(microstructure_crystallite(m) < 1 .or. &
2018-06-27 00:24:54 +05:30
microstructure_crystallite(m) > size(config_crystallite)) &
2019-05-15 02:14:38 +05:30
call IO_error(150,m,ext_msg='crystallite')
if(minval(microstructure_phase(1:microstructure_Nconstituents(m),m)) < 1 .or. &
2018-06-27 00:24:54 +05:30
maxval(microstructure_phase(1:microstructure_Nconstituents(m),m)) > size(config_phase)) &
2019-05-15 02:14:38 +05:30
call IO_error(150,m,ext_msg='phase')
if(minval(microstructure_texture(1:microstructure_Nconstituents(m),m)) < 1 .or. &
2018-06-27 00:24:54 +05:30
maxval(microstructure_texture(1:microstructure_Nconstituents(m),m)) > size(config_texture)) &
2019-05-15 02:14:38 +05:30
call IO_error(150,m,ext_msg='texture')
if(microstructure_Nconstituents(m) < 1) &
call IO_error(151,m)
enddo
2015-10-14 00:22:01 +05:30
2019-05-15 02:14:38 +05:30
debugOut: if (iand(myDebug,debug_levelExtensive) /= 0) then
write(6,'(/,a,/)') ' MATERIAL configuration'
write(6,'(a32,1x,a16,1x,a6)') 'homogenization ','type ','grains'
2019-05-15 02:14:38 +05:30
do h = 1,size(config_homogenization)
write(6,'(1x,a32,1x,a16,1x,i6)') homogenization_name(h),homogenization_type(h),homogenization_Ngrains(h)
enddo
write(6,'(/,a14,18x,1x,a11,1x,a12,1x,a13)') 'microstructure','crystallite','constituents'
2019-05-15 02:14:38 +05:30
do m = 1,size(config_microstructure)
write(6,'(1x,a32,1x,i11,1x,i12)') microstructure_name(m), &
microstructure_crystallite(m), &
microstructure_Nconstituents(m)
2019-05-15 02:14:38 +05:30
if (microstructure_Nconstituents(m) > 0) then
do c = 1,microstructure_Nconstituents(m)
2013-03-28 19:20:20 +05:30
write(6,'(a1,1x,a32,1x,a32,1x,f7.4)') '>',phase_name(microstructure_phase(c,m)),&
texture_name(microstructure_texture(c,m)),&
microstructure_fraction(c,m)
enddo
write(6,*)
endif
enddo
2013-03-28 19:20:20 +05:30
endif debugOut
2015-10-14 00:22:01 +05:30
call material_populateGrains
2019-04-04 16:55:29 +05:30
!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
! new mappings
allocate(material_homogenizationAt,source=theMesh%homogenizationAt)
allocate(material_homogenizationMemberAt(theMesh%elem%nIPs,theMesh%Nelems),source=0)
allocate(CounterHomogenization(size(config_homogenization)),source=0)
do e = 1, theMesh%Nelems
do i = 1, theMesh%elem%nIPs
CounterHomogenization(material_homogenizationAt(e)) = &
CounterHomogenization(material_homogenizationAt(e)) + 1
material_homogenizationMemberAt(i,e) = CounterHomogenization(material_homogenizationAt(e))
enddo
enddo
2019-04-04 16:55:29 +05:30
allocate(material_phaseAt(homogenization_maxNgrains,theMesh%Nelems), source=material_phase(:,1,:))
allocate(material_phaseMemberAt(homogenization_maxNgrains,theMesh%elem%nIPs,theMesh%Nelems),source=0)
allocate(CounterPhase(size(config_phase)),source=0)
do e = 1, theMesh%Nelems
do i = 1, theMesh%elem%nIPs
do c = 1, homogenization_maxNgrains
CounterPhase(material_phaseAt(c,e)) = &
CounterPhase(material_phaseAt(c,e)) + 1
material_phaseMemberAt(c,i,e) = CounterPhase(material_phaseAt(c,e))
enddo
enddo
enddo
#if defined(PETSc) || defined(DAMASK_HDF5)
call results_openJobFile
call results_mapping_constituent(material_phaseAt,material_phaseMemberAt,phase_name)
call results_mapping_materialpoint(material_homogenizationAt,material_homogenizationMemberAt,homogenization_name)
call results_closeJobFile
#endif
2019-04-04 16:55:29 +05:30
!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
! BEGIN DEPRECATED
2019-05-15 02:14:38 +05:30
allocate(phaseAt ( homogenization_maxNgrains,theMesh%elem%nIPs,theMesh%Nelems),source=0)
allocate(phasememberAt ( homogenization_maxNgrains,theMesh%elem%nIPs,theMesh%Nelems),source=0)
allocate(mappingHomogenization (2, theMesh%elem%nIPs,theMesh%Nelems),source=0)
allocate(mappingHomogenizationConst( theMesh%elem%nIPs,theMesh%Nelems),source=1)
2019-03-10 15:53:39 +05:30
2019-04-04 16:55:29 +05:30
CounterHomogenization=0
CounterPhase =0
2019-05-15 02:14:38 +05:30
do e = 1,theMesh%Nelems
2019-03-10 15:06:50 +05:30
myHomog = theMesh%homogenizationAt(e)
2019-05-15 02:14:38 +05:30
do i = 1, theMesh%elem%nIPs
CounterHomogenization(myHomog) = CounterHomogenization(myHomog) + 1
2019-03-10 15:53:39 +05:30
mappingHomogenization(1:2,i,e) = [CounterHomogenization(myHomog),huge(1)]
2019-05-15 02:14:38 +05:30
do g = 1,homogenization_Ngrains(myHomog)
myPhase = material_phase(g,i,e)
2019-05-15 02:14:38 +05:30
CounterPhase(myPhase) = CounterPhase(myPhase)+1 ! not distinguishing between instances of same phase
phaseAt(g,i,e) = myPhase
phasememberAt(g,i,e) = CounterPhase(myPhase)
enddo
enddo
enddo
! END DEPRECATED
! REMOVE !!!!!
! hack needed to initialize field values used during constitutive and crystallite initializations
2018-06-27 00:24:54 +05:30
do myHomog = 1,size(config_homogenization)
thermalMapping (myHomog)%p => mappingHomogenizationConst
damageMapping (myHomog)%p => mappingHomogenizationConst
allocate(temperature (myHomog)%p(1), source=thermal_initialT(myHomog))
allocate(damage (myHomog)%p(1), source=damage_initialPhi(myHomog))
allocate(temperatureRate (myHomog)%p(1), source=0.0_pReal)
enddo
end subroutine material_init
!--------------------------------------------------------------------------------------------------
2018-06-11 03:46:48 +05:30
!> @brief parses the homogenization part from the material configuration
!--------------------------------------------------------------------------------------------------
subroutine material_parseHomogenization
2018-09-24 00:23:35 +05:30
use mesh, only: &
2019-03-10 15:06:50 +05:30
theMesh
2013-03-28 19:20:20 +05:30
use IO, only: &
2018-06-11 03:46:48 +05:30
IO_error
2015-10-14 00:22:01 +05:30
2019-05-15 02:14:38 +05:30
integer :: h
character(len=65536) :: tag
2018-06-27 00:24:54 +05:30
allocate(homogenization_type(size(config_homogenization)), source=HOMOGENIZATION_undefined_ID)
allocate(thermal_type(size(config_homogenization)), source=THERMAL_isothermal_ID)
allocate(damage_type (size(config_homogenization)), source=DAMAGE_none_ID)
2019-05-15 02:14:38 +05:30
allocate(homogenization_typeInstance(size(config_homogenization)), source=0)
allocate(thermal_typeInstance(size(config_homogenization)), source=0)
allocate(damage_typeInstance(size(config_homogenization)), source=0)
allocate(homogenization_Ngrains(size(config_homogenization)), source=0)
allocate(homogenization_Noutput(size(config_homogenization)), source=0)
2018-06-27 00:24:54 +05:30
allocate(homogenization_active(size(config_homogenization)), source=.false.) !!!!!!!!!!!!!!!
allocate(thermal_initialT(size(config_homogenization)), source=300.0_pReal)
allocate(damage_initialPhi(size(config_homogenization)), source=1.0_pReal)
2019-05-15 02:14:38 +05:30
forall (h = 1:size(config_homogenization)) &
2019-03-10 15:06:50 +05:30
homogenization_active(h) = any(theMesh%homogenizationAt == h)
2018-06-27 00:24:54 +05:30
2019-05-15 02:14:38 +05:30
do h=1, size(config_homogenization)
2018-06-27 00:24:54 +05:30
homogenization_Noutput(h) = config_homogenization(h)%countKeys('(output)')
tag = config_homogenization(h)%getString('mech')
2018-06-11 03:46:48 +05:30
select case (trim(tag))
case(HOMOGENIZATION_NONE_label)
homogenization_type(h) = HOMOGENIZATION_NONE_ID
2019-05-15 02:14:38 +05:30
homogenization_Ngrains(h) = 1
2018-06-11 03:46:48 +05:30
case(HOMOGENIZATION_ISOSTRAIN_label)
homogenization_type(h) = HOMOGENIZATION_ISOSTRAIN_ID
2018-06-27 00:24:54 +05:30
homogenization_Ngrains(h) = config_homogenization(h)%getInt('nconstituents')
2018-06-11 03:46:48 +05:30
case(HOMOGENIZATION_RGC_label)
homogenization_type(h) = HOMOGENIZATION_RGC_ID
2018-06-27 00:24:54 +05:30
homogenization_Ngrains(h) = config_homogenization(h)%getInt('nconstituents')
2018-06-11 03:46:48 +05:30
case default
2019-05-15 02:14:38 +05:30
call IO_error(500,ext_msg=trim(tag))
2018-06-11 03:46:48 +05:30
end select
homogenization_typeInstance(h) = count(homogenization_type==homogenization_type(h))
2018-06-27 00:24:54 +05:30
if (config_homogenization(h)%keyExists('thermal')) then
thermal_initialT(h) = config_homogenization(h)%getFloat('t0',defaultVal=300.0_pReal)
2018-06-11 03:46:48 +05:30
2018-06-27 00:24:54 +05:30
tag = config_homogenization(h)%getString('thermal')
2018-06-11 03:46:48 +05:30
select case (trim(tag))
case(THERMAL_isothermal_label)
thermal_type(h) = THERMAL_isothermal_ID
case(THERMAL_adiabatic_label)
thermal_type(h) = THERMAL_adiabatic_ID
case(THERMAL_conduction_label)
thermal_type(h) = THERMAL_conduction_ID
case default
2019-05-15 02:14:38 +05:30
call IO_error(500,ext_msg=trim(tag))
2018-06-11 03:46:48 +05:30
end select
endif
2018-06-27 00:24:54 +05:30
if (config_homogenization(h)%keyExists('damage')) then
damage_initialPhi(h) = config_homogenization(h)%getFloat('initialdamage',defaultVal=1.0_pReal)
2018-06-11 03:46:48 +05:30
2018-06-27 00:24:54 +05:30
tag = config_homogenization(h)%getString('damage')
2018-06-11 03:46:48 +05:30
select case (trim(tag))
case(DAMAGE_NONE_label)
damage_type(h) = DAMAGE_none_ID
case(DAMAGE_LOCAL_label)
damage_type(h) = DAMAGE_local_ID
case(DAMAGE_NONLOCAL_label)
damage_type(h) = DAMAGE_nonlocal_ID
case default
2019-05-15 02:14:38 +05:30
call IO_error(500,ext_msg=trim(tag))
2018-06-11 03:46:48 +05:30
end select
endif
enddo
2019-05-15 02:14:38 +05:30
do h=1, size(config_homogenization)
homogenization_typeInstance(h) = count(homogenization_type(1:h) == homogenization_type(h))
thermal_typeInstance(h) = count(thermal_type (1:h) == thermal_type (h))
damage_typeInstance(h) = count(damage_type (1:h) == damage_type (h))
enddo
homogenization_maxNgrains = maxval(homogenization_Ngrains,homogenization_active)
end subroutine material_parseHomogenization
!--------------------------------------------------------------------------------------------------
!> @brief parses the microstructure part in the material configuration file
!--------------------------------------------------------------------------------------------------
subroutine material_parseMicrostructure
2018-06-11 03:46:48 +05:30
use IO, only: &
IO_floatValue, &
IO_intValue, &
IO_stringValue, &
IO_stringPos, &
2018-06-11 03:46:48 +05:30
IO_error
use mesh, only: &
2019-02-02 16:45:05 +05:30
theMesh
2015-10-14 00:22:01 +05:30
2018-06-11 03:46:48 +05:30
character(len=65536), dimension(:), allocatable :: &
strings
2019-05-15 02:14:38 +05:30
integer, allocatable, dimension(:) :: chunkPos
integer :: e, m, c, i
character(len=65536) :: &
2018-06-11 03:46:48 +05:30
tag
2019-05-15 02:14:38 +05:30
allocate(microstructure_crystallite(size(config_microstructure)), source=0)
allocate(microstructure_Nconstituents(size(config_microstructure)), source=0)
2018-06-27 00:24:54 +05:30
allocate(microstructure_active(size(config_microstructure)), source=.false.)
2019-03-10 15:06:50 +05:30
if(any(theMesh%microstructureAt > size(config_microstructure))) &
2019-05-15 02:14:38 +05:30
call IO_error(155,ext_msg='More microstructures in geometry than sections in material.config')
2019-05-15 02:14:38 +05:30
forall (e = 1:theMesh%Nelems) &
2019-03-10 15:06:50 +05:30
microstructure_active(theMesh%microstructureAt(e)) = .true. ! current microstructure used in model? Elementwise view, maximum N operations for N elements
2015-10-14 00:22:01 +05:30
2019-05-15 02:14:38 +05:30
do m=1, size(config_microstructure)
2018-06-27 00:24:54 +05:30
microstructure_Nconstituents(m) = config_microstructure(m)%countKeys('(constituent)')
microstructure_crystallite(m) = config_microstructure(m)%getInt('crystallite')
enddo
2015-10-14 00:22:01 +05:30
microstructure_maxNconstituents = maxval(microstructure_Nconstituents)
2019-05-15 02:14:38 +05:30
allocate(microstructure_phase (microstructure_maxNconstituents,size(config_microstructure)),source=0)
allocate(microstructure_texture (microstructure_maxNconstituents,size(config_microstructure)),source=0)
2018-06-27 00:24:54 +05:30
allocate(microstructure_fraction(microstructure_maxNconstituents,size(config_microstructure)),source=0.0_pReal)
2015-10-14 00:22:01 +05:30
allocate(strings(1)) ! Intel 16.0 Bug
2019-05-15 02:14:38 +05:30
do m=1, size(config_microstructure)
strings = config_microstructure(m)%getStrings('(constituent)',raw=.true.)
2019-05-15 02:14:38 +05:30
do c = 1, size(strings)
chunkPos = IO_stringPos(strings(c))
2019-05-15 02:14:38 +05:30
do i = 1,5,2
tag = IO_stringValue(strings(c),chunkPos,i)
2018-06-11 03:46:48 +05:30
select case (tag)
case('phase')
2019-05-15 02:14:38 +05:30
microstructure_phase(c,m) = IO_intValue(strings(c),chunkPos,i+1)
2018-06-11 03:46:48 +05:30
case('texture')
2019-05-15 02:14:38 +05:30
microstructure_texture(c,m) = IO_intValue(strings(c),chunkPos,i+1)
2018-06-11 03:46:48 +05:30
case('fraction')
2019-05-15 02:14:38 +05:30
microstructure_fraction(c,m) = IO_floatValue(strings(c),chunkPos,i+1)
2018-06-11 03:46:48 +05:30
end select
enddo
enddo
enddo
2019-05-15 02:14:38 +05:30
do m = 1, size(config_microstructure)
if (dNeq(sum(microstructure_fraction(:,m)),1.0_pReal)) &
2019-05-15 02:14:38 +05:30
call IO_error(153,ext_msg=microstructure_name(m))
enddo
end subroutine material_parseMicrostructure
!--------------------------------------------------------------------------------------------------
!> @brief parses the crystallite part in the material configuration file
!--------------------------------------------------------------------------------------------------
subroutine material_parseCrystallite
2019-05-15 02:14:38 +05:30
integer :: c
2019-05-15 02:14:38 +05:30
allocate(crystallite_Noutput(size(config_crystallite)),source=0)
do c=1, size(config_crystallite)
2018-06-27 00:24:54 +05:30
crystallite_Noutput(c) = config_crystallite(c)%countKeys('(output)')
enddo
end subroutine material_parseCrystallite
!--------------------------------------------------------------------------------------------------
!> @brief parses the phase part in the material configuration file
!--------------------------------------------------------------------------------------------------
subroutine material_parsePhase
2013-03-28 19:20:20 +05:30
use IO, only: &
IO_error, &
IO_getTag, &
IO_stringValue
2013-03-28 19:20:20 +05:30
2019-05-15 02:14:38 +05:30
integer :: sourceCtr, kinematicsCtr, stiffDegradationCtr, p
character(len=65536), dimension(:), allocatable :: str
2015-10-14 00:22:01 +05:30
2018-06-27 00:24:54 +05:30
allocate(phase_elasticity(size(config_phase)),source=ELASTICITY_undefined_ID)
allocate(phase_plasticity(size(config_phase)),source=PLASTICITY_undefined_ID)
2019-05-15 02:14:38 +05:30
allocate(phase_Nsources(size(config_phase)), source=0)
allocate(phase_Nkinematics(size(config_phase)), source=0)
allocate(phase_NstiffnessDegradations(size(config_phase)),source=0)
allocate(phase_Noutput(size(config_phase)), source=0)
2018-06-27 00:24:54 +05:30
allocate(phase_localPlasticity(size(config_phase)), source=.false.)
2019-05-15 02:14:38 +05:30
do p=1, size(config_phase)
2018-06-27 00:24:54 +05:30
phase_Noutput(p) = config_phase(p)%countKeys('(output)')
phase_Nsources(p) = config_phase(p)%countKeys('(source)')
phase_Nkinematics(p) = config_phase(p)%countKeys('(kinematics)')
phase_NstiffnessDegradations(p) = config_phase(p)%countKeys('(stiffness_degradation)')
phase_localPlasticity(p) = .not. config_phase(p)%KeyExists('/nonlocal/')
2018-06-27 00:24:54 +05:30
select case (config_phase(p)%getString('elasticity'))
case (ELASTICITY_HOOKE_label)
phase_elasticity(p) = ELASTICITY_HOOKE_ID
case default
2019-05-15 02:14:38 +05:30
call IO_error(200,ext_msg=trim(config_phase(p)%getString('elasticity')))
end select
2018-06-27 00:24:54 +05:30
select case (config_phase(p)%getString('plasticity'))
case (PLASTICITY_NONE_label)
phase_plasticity(p) = PLASTICITY_NONE_ID
case (PLASTICITY_ISOTROPIC_label)
phase_plasticity(p) = PLASTICITY_ISOTROPIC_ID
case (PLASTICITY_PHENOPOWERLAW_label)
phase_plasticity(p) = PLASTICITY_PHENOPOWERLAW_ID
case (PLASTICITY_KINEHARDENING_label)
phase_plasticity(p) = PLASTICITY_KINEHARDENING_ID
case (PLASTICITY_DISLOTWIN_label)
phase_plasticity(p) = PLASTICITY_DISLOTWIN_ID
case (PLASTICITY_DISLOUCLA_label)
phase_plasticity(p) = PLASTICITY_DISLOUCLA_ID
case (PLASTICITY_NONLOCAL_label)
phase_plasticity(p) = PLASTICITY_NONLOCAL_ID
case default
2019-05-15 02:14:38 +05:30
call IO_error(201,ext_msg=trim(config_phase(p)%getString('plasticity')))
end select
enddo
2018-06-27 00:24:54 +05:30
allocate(phase_source(maxval(phase_Nsources),size(config_phase)), source=SOURCE_undefined_ID)
allocate(phase_kinematics(maxval(phase_Nkinematics),size(config_phase)), source=KINEMATICS_undefined_ID)
allocate(phase_stiffnessDegradation(maxval(phase_NstiffnessDegradations),size(config_phase)), &
source=STIFFNESS_DEGRADATION_undefined_ID)
2019-05-15 02:14:38 +05:30
do p=1, size(config_phase)
#if defined(__GFORTRAN__) || defined(__PGI)
str = ['GfortranBug86277']
2018-06-27 00:24:54 +05:30
str = config_phase(p)%getStrings('(source)',defaultVal=str)
if (str(1) == 'GfortranBug86277') str = [character(len=65536)::]
#else
2018-06-27 00:24:54 +05:30
str = config_phase(p)%getStrings('(source)',defaultVal=[character(len=65536)::])
#endif
2019-05-15 02:14:38 +05:30
do sourceCtr = 1, size(str)
select case (trim(str(sourceCtr)))
case (SOURCE_thermal_dissipation_label)
phase_source(sourceCtr,p) = SOURCE_thermal_dissipation_ID
case (SOURCE_thermal_externalheat_label)
phase_source(sourceCtr,p) = SOURCE_thermal_externalheat_ID
case (SOURCE_damage_isoBrittle_label)
phase_source(sourceCtr,p) = SOURCE_damage_isoBrittle_ID
case (SOURCE_damage_isoDuctile_label)
phase_source(sourceCtr,p) = SOURCE_damage_isoDuctile_ID
case (SOURCE_damage_anisoBrittle_label)
phase_source(sourceCtr,p) = SOURCE_damage_anisoBrittle_ID
case (SOURCE_damage_anisoDuctile_label)
phase_source(sourceCtr,p) = SOURCE_damage_anisoDuctile_ID
end select
enddo
#if defined(__GFORTRAN__) || defined(__PGI)
str = ['GfortranBug86277']
2018-06-27 00:24:54 +05:30
str = config_phase(p)%getStrings('(kinematics)',defaultVal=str)
if (str(1) == 'GfortranBug86277') str = [character(len=65536)::]
#else
2018-06-27 00:24:54 +05:30
str = config_phase(p)%getStrings('(kinematics)',defaultVal=[character(len=65536)::])
#endif
2019-05-15 02:14:38 +05:30
do kinematicsCtr = 1, size(str)
select case (trim(str(kinematicsCtr)))
case (KINEMATICS_cleavage_opening_label)
phase_kinematics(kinematicsCtr,p) = KINEMATICS_cleavage_opening_ID
case (KINEMATICS_slipplane_opening_label)
phase_kinematics(kinematicsCtr,p) = KINEMATICS_slipplane_opening_ID
case (KINEMATICS_thermal_expansion_label)
phase_kinematics(kinematicsCtr,p) = KINEMATICS_thermal_expansion_ID
end select
enddo
#if defined(__GFORTRAN__) || defined(__PGI)
str = ['GfortranBug86277']
2018-06-27 00:24:54 +05:30
str = config_phase(p)%getStrings('(stiffness_degradation)',defaultVal=str)
if (str(1) == 'GfortranBug86277') str = [character(len=65536)::]
#else
2018-06-27 00:24:54 +05:30
str = config_phase(p)%getStrings('(stiffness_degradation)',defaultVal=[character(len=65536)::])
#endif
2019-05-15 02:14:38 +05:30
do stiffDegradationCtr = 1, size(str)
select case (trim(str(stiffDegradationCtr)))
case (STIFFNESS_DEGRADATION_damage_label)
phase_stiffnessDegradation(stiffDegradationCtr,p) = STIFFNESS_DEGRADATION_damage_ID
end select
enddo
enddo
2019-05-15 02:14:38 +05:30
allocate(phase_plasticityInstance(size(config_phase)), source=0)
allocate(phase_elasticityInstance(size(config_phase)), source=0)
2019-05-15 02:14:38 +05:30
do p=1, size(config_phase)
phase_elasticityInstance(p) = count(phase_elasticity(1:p) == phase_elasticity(p))
phase_plasticityInstance(p) = count(phase_plasticity(1:p) == phase_plasticity(p))
enddo
end subroutine material_parsePhase
!--------------------------------------------------------------------------------------------------
!> @brief parses the texture part in the material configuration file
!--------------------------------------------------------------------------------------------------
subroutine material_parseTexture
2013-03-28 19:20:20 +05:30
use IO, only: &
IO_error, &
IO_stringPos, &
IO_floatValue, &
IO_stringValue
2015-10-14 00:22:01 +05:30
2019-05-15 02:14:38 +05:30
integer :: section, gauss, j, t, i
character(len=65536), dimension(:), allocatable :: strings ! Values for given key in material config
2019-05-15 02:14:38 +05:30
integer, dimension(:), allocatable :: chunkPos
2018-06-03 14:14:20 +05:30
2019-05-15 02:14:38 +05:30
allocate(texture_Ngauss(size(config_texture)), source=0)
2019-05-15 02:14:38 +05:30
do t=1, size(config_texture)
2019-05-04 17:49:27 +05:30
texture_Ngauss(t) = config_texture(t)%countKeys('(gauss)')
if (config_texture(t)%keyExists('symmetry')) call IO_error(147,ext_msg='symmetry')
if (config_texture(t)%keyExists('(random)')) call IO_error(147,ext_msg='(random)')
if (config_texture(t)%keyExists('(fiber)')) call IO_error(147,ext_msg='(fiber)')
2018-06-03 14:14:20 +05:30
enddo
texture_maxNgauss = maxval(texture_Ngauss)
2018-06-27 00:24:54 +05:30
allocate(texture_Gauss (5,texture_maxNgauss,size(config_texture)), source=0.0_pReal)
allocate(texture_transformation(3,3,size(config_texture)), source=0.0_pReal)
texture_transformation = spread(math_I3,3,size(config_texture))
2015-10-14 00:22:01 +05:30
2019-05-15 02:14:38 +05:30
do t=1, size(config_texture)
2018-06-03 14:14:20 +05:30
section = t
2019-05-15 02:14:38 +05:30
gauss = 0
2018-06-27 00:24:54 +05:30
if (config_texture(t)%keyExists('axes')) then
strings = config_texture(t)%getStrings('axes')
2019-05-15 02:14:38 +05:30
do j = 1, 3 ! look for "x", "y", and "z" entries
select case (strings(j))
case('x', '+x')
texture_transformation(j,1:3,t) = [ 1.0_pReal, 0.0_pReal, 0.0_pReal] ! original axis is now +x-axis
case('-x')
texture_transformation(j,1:3,t) = [-1.0_pReal, 0.0_pReal, 0.0_pReal] ! original axis is now -x-axis
case('y', '+y')
texture_transformation(j,1:3,t) = [ 0.0_pReal, 1.0_pReal, 0.0_pReal] ! original axis is now +y-axis
case('-y')
texture_transformation(j,1:3,t) = [ 0.0_pReal,-1.0_pReal, 0.0_pReal] ! original axis is now -y-axis
case('z', '+z')
texture_transformation(j,1:3,t) = [ 0.0_pReal, 0.0_pReal, 1.0_pReal] ! original axis is now +z-axis
case('-z')
texture_transformation(j,1:3,t) = [ 0.0_pReal, 0.0_pReal,-1.0_pReal] ! original axis is now -z-axis
case default
2019-05-15 02:14:38 +05:30
call IO_error(157,t)
end select
enddo
2019-05-15 02:14:38 +05:30
if(dNeq(math_det33(texture_transformation(1:3,1:3,t)),1.0_pReal)) call IO_error(157,t)
endif
2018-06-27 00:24:54 +05:30
if (config_texture(t)%keyExists('(gauss)')) then
2019-05-15 02:14:38 +05:30
gauss = gauss + 1
2018-06-27 00:24:54 +05:30
strings = config_texture(t)%getStrings('(gauss)',raw= .true.)
2019-05-15 02:14:38 +05:30
do i = 1 , size(strings)
chunkPos = IO_stringPos(strings(i))
2019-05-15 02:14:38 +05:30
do j = 1,9,2
select case (IO_stringValue(strings(i),chunkPos,j))
case('phi1')
2019-05-15 02:14:38 +05:30
texture_Gauss(1,gauss,t) = IO_floatValue(strings(i),chunkPos,j+1)*inRad
case('phi')
2019-05-15 02:14:38 +05:30
texture_Gauss(2,gauss,t) = IO_floatValue(strings(i),chunkPos,j+1)*inRad
case('phi2')
2019-05-15 02:14:38 +05:30
texture_Gauss(3,gauss,t) = IO_floatValue(strings(i),chunkPos,j+1)*inRad
end select
enddo
enddo
endif
enddo
2018-06-27 00:20:06 +05:30
2018-08-22 18:00:51 +05:30
call config_deallocate('material.config/texture')
end subroutine material_parseTexture
2018-10-14 23:46:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief allocates the plastic state of a phase
!--------------------------------------------------------------------------------------------------
subroutine material_allocatePlasticState(phase,NofMyPhase,&
sizeState,sizeDotState,sizeDeltaState,&
2018-10-14 23:46:30 +05:30
Nslip,Ntwin,Ntrans)
use numerics, only: &
numerics_integrator
2018-10-14 23:46:30 +05:30
2019-05-15 02:14:38 +05:30
integer, intent(in) :: &
2018-10-14 23:46:30 +05:30
phase, &
NofMyPhase, &
sizeState, &
sizeDotState, &
sizeDeltaState, &
Nslip, &
Ntwin, &
Ntrans
plasticState(phase)%sizeState = sizeState
plasticState(phase)%sizeDotState = sizeDotState
plasticState(phase)%sizeDeltaState = sizeDeltaState
plasticState(phase)%offsetDeltaState = sizeState-sizeDeltaState ! deltaState occupies latter part of state by definition
2018-10-14 23:46:30 +05:30
plasticState(phase)%Nslip = Nslip
plasticState(phase)%Ntwin = Ntwin
plasticState(phase)%Ntrans= Ntrans
allocate(plasticState(phase)%aTolState (sizeState), source=0.0_pReal)
allocate(plasticState(phase)%state0 (sizeState,NofMyPhase), source=0.0_pReal)
allocate(plasticState(phase)%partionedState0 (sizeState,NofMyPhase), source=0.0_pReal)
allocate(plasticState(phase)%subState0 (sizeState,NofMyPhase), source=0.0_pReal)
allocate(plasticState(phase)%state (sizeState,NofMyPhase), source=0.0_pReal)
allocate(plasticState(phase)%dotState (sizeDotState,NofMyPhase), source=0.0_pReal)
2019-05-15 02:14:38 +05:30
if (numerics_integrator == 1) then
2018-10-14 23:46:30 +05:30
allocate(plasticState(phase)%previousDotState (sizeDotState,NofMyPhase), source=0.0_pReal)
allocate(plasticState(phase)%previousDotState2 (sizeDotState,NofMyPhase), source=0.0_pReal)
endif
2019-05-15 02:14:38 +05:30
if (numerics_integrator == 4) &
2018-10-14 23:46:30 +05:30
allocate(plasticState(phase)%RK4dotState (sizeDotState,NofMyPhase), source=0.0_pReal)
2019-05-15 02:14:38 +05:30
if (numerics_integrator == 5) &
2018-10-14 23:46:30 +05:30
allocate(plasticState(phase)%RKCK45dotState (6,sizeDotState,NofMyPhase), source=0.0_pReal)
allocate(plasticState(phase)%deltaState (sizeDeltaState,NofMyPhase), source=0.0_pReal)
end subroutine material_allocatePlasticState
2019-02-13 11:52:37 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief allocates the source state of a phase
!--------------------------------------------------------------------------------------------------
subroutine material_allocateSourceState(phase,of,NofMyPhase,&
sizeState,sizeDotState,sizeDeltaState)
2019-02-13 11:52:37 +05:30
use numerics, only: &
numerics_integrator
2019-02-13 11:52:37 +05:30
2019-05-15 02:14:38 +05:30
integer, intent(in) :: &
2019-02-13 11:52:37 +05:30
phase, &
of, &
NofMyPhase, &
sizeState, sizeDotState,sizeDeltaState
2019-02-13 11:52:37 +05:30
sourceState(phase)%p(of)%sizeState = sizeState
sourceState(phase)%p(of)%sizeDotState = sizeDotState
sourceState(phase)%p(of)%sizeDeltaState = sizeDeltaState
2019-02-27 11:51:40 +05:30
sourceState(phase)%p(of)%offsetDeltaState = sizeState-sizeDeltaState ! deltaState occupies latter part of state by definition
2019-02-13 11:52:37 +05:30
allocate(sourceState(phase)%p(of)%aTolState (sizeState), source=0.0_pReal)
allocate(sourceState(phase)%p(of)%state0 (sizeState,NofMyPhase), source=0.0_pReal)
allocate(sourceState(phase)%p(of)%partionedState0 (sizeState,NofMyPhase), source=0.0_pReal)
allocate(sourceState(phase)%p(of)%subState0 (sizeState,NofMyPhase), source=0.0_pReal)
allocate(sourceState(phase)%p(of)%state (sizeState,NofMyPhase), source=0.0_pReal)
allocate(sourceState(phase)%p(of)%dotState (sizeDotState,NofMyPhase), source=0.0_pReal)
2019-05-15 02:14:38 +05:30
if (numerics_integrator == 1) then
allocate(sourceState(phase)%p(of)%previousDotState (sizeDotState,NofMyPhase), source=0.0_pReal)
allocate(sourceState(phase)%p(of)%previousDotState2 (sizeDotState,NofMyPhase), source=0.0_pReal)
2019-02-13 11:52:37 +05:30
endif
2019-05-15 02:14:38 +05:30
if (numerics_integrator == 4) &
allocate(sourceState(phase)%p(of)%RK4dotState (sizeDotState,NofMyPhase), source=0.0_pReal)
2019-05-15 02:14:38 +05:30
if (numerics_integrator == 5) &
allocate(sourceState(phase)%p(of)%RKCK45dotState (6,sizeDotState,NofMyPhase), source=0.0_pReal)
2019-02-13 11:52:37 +05:30
2019-02-23 01:36:37 +05:30
allocate(sourceState(phase)%p(of)%deltaState (sizeDeltaState,NofMyPhase), source=0.0_pReal)
2019-02-13 11:52:37 +05:30
end subroutine material_allocateSourceState
!--------------------------------------------------------------------------------------------------
!> @brief populates the grains
!> @details populates the grains by identifying active microstructure/homogenization pairs,
2018-10-14 13:41:26 +05:30
!! calculates the volume of the grains and deals with texture components
!--------------------------------------------------------------------------------------------------
subroutine material_populateGrains
use mesh, only: &
2019-05-04 20:48:05 +05:30
theMesh
2019-05-15 02:14:38 +05:30
integer :: e,i,c,homog,micro
2015-10-14 00:22:01 +05:30
2019-05-15 02:14:38 +05:30
allocate(material_phase(homogenization_maxNgrains,theMesh%elem%nIPs,theMesh%Nelems), source=0)
allocate(material_texture(homogenization_maxNgrains,theMesh%elem%nIPs,theMesh%Nelems), source=0)
2019-02-02 16:45:05 +05:30
allocate(material_EulerAngles(3,homogenization_maxNgrains,theMesh%elem%nIPs,theMesh%Nelems),source=0.0_pReal)
2015-10-14 00:22:01 +05:30
do e = 1, theMesh%Nelems
do i = 1, theMesh%elem%nIPs
homog = theMesh%homogenizationAt(e)
micro = theMesh%microstructureAt(e)
do c = 1, homogenization_Ngrains(homog)
material_phase(c,i,e) = microstructure_phase(c,micro)
material_texture(c,i,e) = microstructure_texture(c,micro)
material_EulerAngles(1:3,c,i,e) = texture_Gauss(1:3,1,material_texture(c,i,e))
material_EulerAngles(1:3,c,i,e) = math_RtoEuler( & ! translate back to Euler angles
2019-05-09 02:11:09 +05:30
matmul( & ! pre-multiply
math_EulertoR(material_EulerAngles(1:3,c,i,e)), & ! face-value orientation
texture_transformation(1:3,1:3,material_texture(c,i,e)) & ! and transformation matrix
) &
)
enddo
enddo
enddo
deallocate(texture_transformation)
2019-05-04 17:49:27 +05:30
2018-08-22 18:00:51 +05:30
call config_deallocate('material.config/microstructure')
end subroutine material_populateGrains
end module material