2009-08-31 20:39:15 +05:30
!* $Id$
2009-05-07 21:57:36 +05:30
!***************************************
!* Module: CRYSTALLITE *
!***************************************
!* contains: *
!* - _init *
!* - materialpoint_stressAndItsTangent *
!* - _partitionDeformation *
!* - _updateState *
2009-06-09 16:35:29 +05:30
!* - _stressAndItsTangent *
2009-05-07 21:57:36 +05:30
!* - _postResults *
!***************************************
2010-10-01 17:48:49 +05:30
2009-05-07 21:57:36 +05:30
MODULE crystallite
2009-06-16 14:33:30 +05:30
use prec , only : pReal , pInt
implicit none
2009-05-07 21:57:36 +05:30
!
! ****************************************************************
! *** General variables for the crystallite calculation ***
! ****************************************************************
2009-07-01 16:25:31 +05:30
2010-02-25 23:09:11 +05:30
integer ( pInt ) crystallite_maxSizePostResults
integer ( pInt ) , dimension ( : ) , allocatable :: crystallite_sizePostResults
integer ( pInt ) , dimension ( : , : ) , allocatable :: crystallite_sizePostResult
character ( len = 64 ) , dimension ( : , : ) , allocatable :: crystallite_output ! name of each post result output
2010-04-19 15:33:34 +05:30
integer ( pInt ) , dimension ( : , : , : ) , allocatable :: &
crystallite_symmetryID ! crystallographic symmetry 1=cubic 2=hexagonal, needed in all orientation calcs
2010-02-25 23:09:11 +05:30
2010-02-18 20:36:08 +05:30
real ( pReal ) , dimension ( : , : , : ) , allocatable :: &
crystallite_dt , & ! requested time increment of each grain
crystallite_subdt , & ! substepped time increment of each grain
crystallite_subFrac , & ! already calculated fraction of increment
crystallite_subStep , & ! size of next integration step
2010-10-01 17:48:49 +05:30
crystallite_statedamper , & ! damping for state update
2010-02-18 20:36:08 +05:30
crystallite_Temperature , & ! Temp of each grain
crystallite_partionedTemperature0 , & ! Temp of each grain at start of homog inc
2010-04-29 13:11:29 +05:30
crystallite_subTemperature0 , & ! Temp of each grain at start of crystallite inc
2010-10-01 17:48:49 +05:30
crystallite_dotTemperature ! evolution of Temperature of each grain
2010-02-18 20:36:08 +05:30
real ( pReal ) , dimension ( : , : , : , : ) , allocatable :: &
crystallite_Tstar_v , & ! current 2nd Piola-Kirchhoff stress vector (end of converged time step)
crystallite_Tstar0_v , & ! 2nd Piola-Kirchhoff stress vector at start of FE inc
crystallite_partionedTstar0_v , & ! 2nd Piola-Kirchhoff stress vector at start of homog inc
crystallite_subTstar0_v , & ! 2nd Piola-Kirchhoff stress vector at start of crystallite inc
2010-04-12 16:44:36 +05:30
crystallite_orientation , & ! orientation as quaternion
crystallite_orientation0 , & ! initial orientation as quaternion
crystallite_rotation ! grain rotation away from initial orientation as axis-angle (in degrees)
2010-02-18 20:36:08 +05:30
real ( pReal ) , dimension ( : , : , : , : , : ) , allocatable :: &
crystallite_Fe , & ! current "elastic" def grad (end of converged time step)
crystallite_Fp , & ! current plastic def grad (end of converged time step)
crystallite_invFp , & ! inverse of current plastic def grad (end of converged time step)
crystallite_Fp0 , & ! plastic def grad at start of FE inc
crystallite_partionedFp0 , & ! plastic def grad at start of homog inc
crystallite_subFp0 , & ! plastic def grad at start of crystallite inc
crystallite_F0 , & ! def grad at start of FE inc
crystallite_partionedF , & ! def grad to be reached at end of homog inc
crystallite_partionedF0 , & ! def grad at start of homog inc
crystallite_subF , & ! def grad to be reached at end of crystallite inc
crystallite_subF0 , & ! def grad at start of crystallite inc
crystallite_Lp , & ! current plastic velocitiy grad (end of converged time step)
crystallite_Lp0 , & ! plastic velocitiy grad at start of FE inc
crystallite_partionedLp0 , & ! plastic velocity grad at start of homog inc
crystallite_subLp0 , & ! plastic velocity grad at start of crystallite inc
crystallite_P , & ! 1st Piola-Kirchhoff stress per grain
2010-04-28 22:49:58 +05:30
crystallite_disorientation ! disorientation between two neighboring ips (only calculated for single grain IPs)
2010-02-18 20:36:08 +05:30
real ( pReal ) , dimension ( : , : , : , : , : , : , : ) , allocatable :: &
2010-10-01 17:48:49 +05:30
crystallite_dPdF , & ! current individual dPdF per grain (end of converged time step)
crystallite_dPdF0 , & ! individual dPdF per grain at start of FE inc
crystallite_partioneddPdF0 , & ! individual dPdF per grain at start of homog inc
2010-02-18 20:36:08 +05:30
crystallite_fallbackdPdF ! dPdF fallback for non-converged grains (elastic prediction)
logical , dimension ( : , : , : ) , allocatable :: &
crystallite_localConstitution , & ! indicates this grain to have purely local constitutive law
crystallite_requested , & ! flag to request crystallite calculation
2010-10-01 17:48:49 +05:30
crystallite_todo , & ! flag to indicate need for further computation
2010-02-18 20:36:08 +05:30
crystallite_converged , & ! convergence flag
crystallite_stateConverged , & ! flag indicating convergence of state
2010-02-23 15:16:39 +05:30
crystallite_temperatureConverged ! flag indicating convergence of temperature
2009-06-16 14:33:30 +05:30
CONTAINS
2009-05-07 21:57:36 +05:30
!********************************************************************
! allocate and initialize per grain variables
!********************************************************************
2009-07-01 16:25:31 +05:30
subroutine crystallite_init ( Temperature )
2010-02-25 23:09:11 +05:30
!*** variables and functions from other modules ***!
use prec , only : pInt , &
pReal
use debug , only : debug_info , &
debug_reset
2010-10-01 17:48:49 +05:30
use numerics , only : integrator , &
integratorStiffness , &
subStepSizeCryst , &
stepIncreaseCryst
2010-02-25 23:09:11 +05:30
use math , only : math_I3 , &
2010-05-26 22:04:44 +05:30
math_EulerToR
2010-02-25 23:09:11 +05:30
use FEsolving , only : FEsolving_execElem , &
FEsolving_execIP
use mesh , only : mesh_element , &
mesh_NcpElems , &
mesh_maxNips , &
mesh_maxNipNeighbors
use IO
use material
2010-10-01 17:48:49 +05:30
use lattice , only : lattice_symmetryTypes
2010-04-19 15:33:34 +05:30
use constitutive_phenopowerlaw , only : constitutive_phenopowerlaw_label , &
constitutive_phenopowerlaw_structure
2010-09-13 14:59:03 +05:30
use constitutive_titanmod , only : constitutive_titanmod_label , &
constitutive_titanmod_structure
2010-04-19 15:33:34 +05:30
use constitutive_dislotwin , only : constitutive_dislotwin_label , &
constitutive_dislotwin_structure
use constitutive_nonlocal , only : constitutive_nonlocal_label , &
constitutive_nonlocal_structure
2009-06-09 16:35:29 +05:30
2010-02-25 23:09:11 +05:30
implicit none
integer ( pInt ) , parameter :: file = 200
2009-06-09 16:35:29 +05:30
2010-02-25 23:09:11 +05:30
!*** input variables ***!
real ( pReal ) Temperature
!*** output variables ***!
2010-09-06 21:36:41 +05:30
2010-02-25 23:09:11 +05:30
!*** local variables ***!
integer ( pInt ) , parameter :: maxNchunks = 2
integer ( pInt ) , dimension ( 1 + 2 * maxNchunks ) :: positions
integer ( pInt ) g , & ! grain number
i , & ! integration point number
e , & ! element number
gMax , & ! maximum number of grains
iMax , & ! maximum number of integration points
eMax , & ! maximum number of elements
nMax , & ! maximum number of ip neighbors
myNgrains , & ! number of grains in current IP
myCrystallite ! crystallite of current elem
integer ( pInt ) section , j , p , output , mySize
character ( len = 64 ) tag
character ( len = 1024 ) line
2010-04-19 15:33:34 +05:30
integer ( pInt ) myStructure , & ! lattice structure
myPhase
2010-08-26 15:22:40 +05:30
write ( 6 , * )
write ( 6 , * ) '<<<+- crystallite init -+>>>'
write ( 6 , * ) '$Id$'
write ( 6 , * )
2010-02-25 23:09:11 +05:30
gMax = homogenization_maxNgrains
iMax = mesh_maxNips
eMax = mesh_NcpElems
nMax = mesh_maxNipNeighbors
allocate ( crystallite_Temperature ( gMax , iMax , eMax ) ) ; crystallite_Temperature = Temperature
2010-10-01 17:48:49 +05:30
allocate ( crystallite_partionedTemperature0 ( gMax , iMax , eMax ) ) ; crystallite_partionedTemperature0 = 0.0_pReal
allocate ( crystallite_subTemperature0 ( gMax , iMax , eMax ) ) ; crystallite_subTemperature0 = 0.0_pReal
allocate ( crystallite_dotTemperature ( gMax , iMax , eMax ) ) ; crystallite_dotTemperature = 0.0_pReal
allocate ( crystallite_Tstar0_v ( 6 , gMax , iMax , eMax ) ) ; crystallite_Tstar0_v = 0.0_pReal
allocate ( crystallite_partionedTstar0_v ( 6 , gMax , iMax , eMax ) ) ; crystallite_partionedTstar0_v = 0.0_pReal
allocate ( crystallite_subTstar0_v ( 6 , gMax , iMax , eMax ) ) ; crystallite_subTstar0_v = 0.0_pReal
2010-02-25 23:09:11 +05:30
allocate ( crystallite_Tstar_v ( 6 , gMax , iMax , eMax ) ) ; crystallite_Tstar_v = 0.0_pReal
2010-10-01 17:48:49 +05:30
allocate ( crystallite_P ( 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_P = 0.0_pReal
2010-02-25 23:09:11 +05:30
allocate ( crystallite_F0 ( 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_F0 = 0.0_pReal
allocate ( crystallite_partionedF0 ( 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_partionedF0 = 0.0_pReal
2010-10-01 17:48:49 +05:30
allocate ( crystallite_partionedF ( 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_partionedF = 0.0_pReal
2010-02-25 23:09:11 +05:30
allocate ( crystallite_subF0 ( 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_subF0 = 0.0_pReal
2010-10-01 17:48:49 +05:30
allocate ( crystallite_subF ( 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_subF = 0.0_pReal
allocate ( crystallite_Fp0 ( 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_Fp0 = 0.0_pReal
allocate ( crystallite_partionedFp0 ( 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_partionedFp0 = 0.0_pReal
2010-02-25 23:09:11 +05:30
allocate ( crystallite_subFp0 ( 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_subFp0 = 0.0_pReal
2010-10-01 17:48:49 +05:30
allocate ( crystallite_Fp ( 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_Fp = 0.0_pReal
allocate ( crystallite_invFp ( 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_invFp = 0.0_pReal
allocate ( crystallite_Fe ( 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_Fe = 0.0_pReal
allocate ( crystallite_Lp0 ( 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_Lp0 = 0.0_pReal
allocate ( crystallite_partionedLp0 ( 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_partionedLp0 = 0.0_pReal
2010-02-25 23:09:11 +05:30
allocate ( crystallite_subLp0 ( 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_subLp0 = 0.0_pReal
2010-10-01 17:48:49 +05:30
allocate ( crystallite_Lp ( 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_Lp = 0.0_pReal
2010-02-25 23:09:11 +05:30
allocate ( crystallite_dPdF ( 3 , 3 , 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_dPdF = 0.0_pReal
2010-10-01 17:48:49 +05:30
allocate ( crystallite_dPdF0 ( 3 , 3 , 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_dPdF0 = 0.0_pReal
allocate ( crystallite_partioneddPdF0 ( 3 , 3 , 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_partioneddPdF0 = 0.0_pReal
2010-02-25 23:09:11 +05:30
allocate ( crystallite_fallbackdPdF ( 3 , 3 , 3 , 3 , gMax , iMax , eMax ) ) ; crystallite_fallbackdPdF = 0.0_pReal
allocate ( crystallite_dt ( gMax , iMax , eMax ) ) ; crystallite_dt = 0.0_pReal
allocate ( crystallite_subdt ( gMax , iMax , eMax ) ) ; crystallite_subdt = 0.0_pReal
allocate ( crystallite_subFrac ( gMax , iMax , eMax ) ) ; crystallite_subFrac = 0.0_pReal
allocate ( crystallite_subStep ( gMax , iMax , eMax ) ) ; crystallite_subStep = 0.0_pReal
2010-04-29 13:11:29 +05:30
allocate ( crystallite_statedamper ( gMax , iMax , eMax ) ) ; crystallite_statedamper = 1.0_pReal
2010-10-01 17:48:49 +05:30
allocate ( crystallite_symmetryID ( gMax , iMax , eMax ) ) ; crystallite_symmetryID = 0.0_pReal !NEW
allocate ( crystallite_orientation ( 4 , gMax , iMax , eMax ) ) ; crystallite_orientation = 0.0_pReal
allocate ( crystallite_orientation0 ( 4 , gMax , iMax , eMax ) ) ; crystallite_orientation = 0.0_pReal
allocate ( crystallite_rotation ( 4 , gMax , iMax , eMax ) ) ; crystallite_rotation = 0.0_pReal
allocate ( crystallite_disorientation ( 4 , nMax , gMax , iMax , eMax ) ) ; crystallite_disorientation = 0.0_pReal
2010-02-25 23:09:11 +05:30
allocate ( crystallite_localConstitution ( gMax , iMax , eMax ) ) ; crystallite_localConstitution = . true .
allocate ( crystallite_requested ( gMax , iMax , eMax ) ) ; crystallite_requested = . false .
2010-10-01 17:48:49 +05:30
allocate ( crystallite_todo ( gMax , iMax , eMax ) ) ; crystallite_todo = . false .
2010-02-25 23:09:11 +05:30
allocate ( crystallite_converged ( gMax , iMax , eMax ) ) ; crystallite_converged = . true .
allocate ( crystallite_stateConverged ( gMax , iMax , eMax ) ) ; crystallite_stateConverged = . false .
allocate ( crystallite_temperatureConverged ( gMax , iMax , eMax ) ) ; crystallite_temperatureConverged = . false .
2010-10-01 17:48:49 +05:30
2010-02-25 23:09:11 +05:30
allocate ( crystallite_output ( maxval ( crystallite_Noutput ) , &
material_Ncrystallite ) ) ; crystallite_output = ''
allocate ( crystallite_sizePostResults ( material_Ncrystallite ) ) ; crystallite_sizePostResults = 0_pInt
allocate ( crystallite_sizePostResult ( maxval ( crystallite_Noutput ) , &
material_Ncrystallite ) ) ; crystallite_sizePostResult = 0_pInt
if ( . not . IO_open_file ( file , material_configFile ) ) call IO_error ( 100 ) ! corrupt config file
line = ''
section = 0
do while ( IO_lc ( IO_getTag ( line , '<' , '>' ) ) / = material_partCrystallite ) ! wind forward to <crystallite>
read ( file , '(a1024)' , END = 100 ) line
enddo
do ! read thru sections of phase part
read ( file , '(a1024)' , END = 100 ) line
if ( IO_isBlank ( line ) ) cycle ! skip empty lines
if ( IO_getTag ( line , '<' , '>' ) / = '' ) exit ! stop at next part
if ( IO_getTag ( line , '[' , ']' ) / = '' ) then ! next section
section = section + 1
output = 0 ! reset output counter
endif
if ( section > 0 ) then
positions = IO_stringPos ( line , maxNchunks )
tag = IO_lc ( IO_stringValue ( line , positions , 1 ) ) ! extract key
select case ( tag )
case ( '(output)' )
output = output + 1
crystallite_output ( output , section ) = IO_lc ( IO_stringValue ( line , positions , 2 ) )
end select
endif
enddo
100 close ( file )
do i = 1 , material_Ncrystallite ! sanity checks
enddo
do i = 1 , material_Ncrystallite
do j = 1 , crystallite_Noutput ( i )
select case ( crystallite_output ( j , i ) )
case ( 'phase' )
mySize = 1
case ( 'volume' )
mySize = 1
2010-04-12 16:44:36 +05:30
case ( 'orientation' ) ! orientation as quaternion
2010-03-18 17:53:17 +05:30
mySize = 4
2010-04-12 16:44:36 +05:30
case ( 'eulerangles' ) ! Bunge Euler angles
2010-02-25 23:09:11 +05:30
mySize = 3
2010-04-12 16:44:36 +05:30
case ( 'grainrotation' ) ! Deviation from initial grain orientation in axis-angle form (angle in degrees)
mySize = 4
2010-05-18 13:27:13 +05:30
case ( 'defgrad' , 'f' , 'fe' , 'fp' , 'ee' , 'p' , 'firstpiola' , '1stpiola' , 's' , 'tstar' , 'secondpiola' , '2ndpiola' )
2010-02-25 23:09:11 +05:30
mySize = 9
case default
mySize = 0
end select
if ( mySize > 0_pInt ) then ! any meaningful output found
crystallite_sizePostResult ( j , i ) = mySize
crystallite_sizePostResults ( i ) = crystallite_sizePostResults ( i ) + mySize
endif
enddo
enddo
crystallite_maxSizePostResults = maxval ( crystallite_sizePostResults )
2009-06-16 14:33:30 +05:30
2010-02-25 23:09:11 +05:30
! write description file for crystallite output
if ( . not . IO_open_jobFile ( file , 'outputCrystallite' ) ) call IO_error ( 50 ) ! problems in writing file
do p = 1 , material_Ncrystallite
write ( file , * )
write ( file , '(a)' ) '[' / / trim ( crystallite_name ( p ) ) / / ']'
write ( file , * )
do e = 1 , crystallite_Noutput ( p )
write ( file , '(a,i4)' ) trim ( crystallite_output ( e , p ) ) / / char ( 9 ) , crystallite_sizePostResult ( e , p )
enddo
enddo
close ( file )
!$OMP PARALLEL DO
do e = FEsolving_execElem ( 1 ) , FEsolving_execElem ( 2 ) ! iterate over all cp elements
myNgrains = homogenization_Ngrains ( mesh_element ( 3 , e ) ) ! look up homogenization-->grainCount
do i = FEsolving_execIP ( 1 , e ) , FEsolving_execIP ( 2 , e ) ! iterate over IPs of this element
do g = 1 , myNgrains
crystallite_partionedTemperature0 ( g , i , e ) = Temperature ! isothermal assumption
crystallite_Fp0 ( : , : , g , i , e ) = math_EulerToR ( material_EulerAngles ( : , g , i , e ) ) ! plastic def gradient reflects init orientation
crystallite_Fe ( : , : , g , i , e ) = transpose ( crystallite_Fp0 ( : , : , g , i , e ) )
crystallite_F0 ( : , : , g , i , e ) = math_I3
crystallite_partionedFp0 ( : , : , g , i , e ) = crystallite_Fp0 ( : , : , g , i , e )
crystallite_partionedF0 ( : , : , g , i , e ) = crystallite_F0 ( : , : , g , i , e )
crystallite_partionedF ( : , : , g , i , e ) = crystallite_F0 ( : , : , g , i , e )
crystallite_requested ( g , i , e ) = . true .
crystallite_localConstitution ( g , i , e ) = phase_localConstitution ( material_phase ( g , i , e ) )
enddo
enddo
enddo
!$OMPEND PARALLEL DO
2009-12-22 17:58:02 +05:30
2010-04-19 15:33:34 +05:30
! Initialize crystallite_symmetryID(g,i,e)
!$OMP PARALLEL DO
do e = FEsolving_execElem ( 1 ) , FEsolving_execElem ( 2 )
do i = FEsolving_execIP ( 1 , e ) , FEsolving_execIP ( 2 , e )
do g = 1 , homogenization_Ngrains ( mesh_element ( 3 , e ) )
myPhase = material_phase ( g , i , e )
select case ( phase_constitution ( myPhase ) )
case ( constitutive_phenopowerlaw_label )
myStructure = constitutive_phenopowerlaw_structure ( phase_constitutionInstance ( myPhase ) )
2010-09-13 14:59:03 +05:30
case ( constitutive_titanmod_label )
myStructure = constitutive_titanmod_structure ( phase_constitutionInstance ( myPhase ) )
2010-04-19 15:33:34 +05:30
case ( constitutive_dislotwin_label )
myStructure = constitutive_dislotwin_structure ( phase_constitutionInstance ( myPhase ) )
case ( constitutive_nonlocal_label )
myStructure = constitutive_nonlocal_structure ( phase_constitutionInstance ( myPhase ) )
case default
myStructure = - 1_pInt ! does this happen for j2 material?
end select
if ( myStructure > 0_pInt ) then
2010-10-01 17:48:49 +05:30
crystallite_symmetryID ( g , i , e ) = lattice_symmetryTypes ( myStructure ) ! structure = 1(fcc) or 2(bcc) => 1; 3(hex)=>2
2010-04-19 15:33:34 +05:30
endif
enddo
enddo
enddo
!$OMPEND PARALLEL DO
2010-10-01 17:48:49 +05:30
2009-12-18 21:16:33 +05:30
call crystallite_orientations ( )
2010-10-01 17:48:49 +05:30
crystallite_orientation0 = crystallite_orientation ! Store initial orientations for calculation of grain rotations
2010-04-12 16:44:36 +05:30
2009-06-16 14:33:30 +05:30
call crystallite_stressAndItsTangent ( . true . ) ! request elastic answers
crystallite_fallbackdPdF = crystallite_dPdF ! use initial elastic stiffness as fallback
2009-05-07 21:57:36 +05:30
2009-06-16 14:33:30 +05:30
! *** Output to MARC output file ***
!$OMP CRITICAL (write2out)
2009-08-11 22:01:57 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_Temperature: ' , shape ( crystallite_Temperature )
2010-10-01 17:48:49 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_dotTemperature: ' , shape ( crystallite_dotTemperature )
2009-08-11 22:01:57 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_Fe: ' , shape ( crystallite_Fe )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_Fp: ' , shape ( crystallite_Fp )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_Lp: ' , shape ( crystallite_Lp )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_F0: ' , shape ( crystallite_F0 )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_Fp0: ' , shape ( crystallite_Fp0 )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_Lp0: ' , shape ( crystallite_Lp0 )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_partionedF: ' , shape ( crystallite_partionedF )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_partionedTemp0: ' , shape ( crystallite_partionedTemperature0 )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_partionedF0: ' , shape ( crystallite_partionedF0 )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_partionedFp0: ' , shape ( crystallite_partionedFp0 )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_partionedLp0: ' , shape ( crystallite_partionedLp0 )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_subF: ' , shape ( crystallite_subF )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_subTemperature0: ' , shape ( crystallite_subTemperature0 )
2010-04-19 15:33:34 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_symmetryID: ' , shape ( crystallite_symmetryID ) !NEW
2009-08-11 22:01:57 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_subF0: ' , shape ( crystallite_subF0 )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_subFp0: ' , shape ( crystallite_subFp0 )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_subLp0: ' , shape ( crystallite_subLp0 )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_P: ' , shape ( crystallite_P )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_Tstar_v: ' , shape ( crystallite_Tstar_v )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_Tstar0_v: ' , shape ( crystallite_Tstar0_v )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_partionedTstar0_v: ' , shape ( crystallite_partionedTstar0_v )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_subTstar0_v: ' , shape ( crystallite_subTstar0_v )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_dPdF: ' , shape ( crystallite_dPdF )
2010-10-01 17:48:49 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_dPdF0: ' , shape ( crystallite_dPdF0 )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_partioneddPdF0: ' , shape ( crystallite_partioneddPdF0 )
2009-08-11 22:01:57 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_fallbackdPdF: ' , shape ( crystallite_fallbackdPdF )
2010-03-24 21:53:21 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_orientation: ' , shape ( crystallite_orientation )
2010-04-19 15:33:34 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_orientation0: ' , shape ( crystallite_orientation0 )
2010-04-12 16:44:36 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_rotation: ' , shape ( crystallite_rotation )
2010-04-28 22:49:58 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_disorientation: ' , shape ( crystallite_disorientation )
2009-08-11 22:01:57 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_dt: ' , shape ( crystallite_dt )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_subdt: ' , shape ( crystallite_subdt )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_subFrac: ' , shape ( crystallite_subFrac )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_subStep: ' , shape ( crystallite_subStep )
2010-10-01 17:48:49 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_stateDamper: ' , shape ( crystallite_stateDamper )
2009-08-27 17:40:06 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_localConstitution: ' , shape ( crystallite_localConstitution )
2009-08-11 22:01:57 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_requested: ' , shape ( crystallite_requested )
2010-03-24 21:53:21 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_todo: ' , shape ( crystallite_todo )
2009-08-11 22:01:57 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_converged: ' , shape ( crystallite_converged )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_stateConverged: ' , shape ( crystallite_stateConverged )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_temperatureConverged: ' , shape ( crystallite_temperatureConverged )
2010-03-24 21:53:21 +05:30
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_sizePostResults: ' , shape ( crystallite_sizePostResults )
write ( 6 , '(a35,x,7(i5,x))' ) 'crystallite_sizePostResult: ' , shape ( crystallite_sizePostResult )
2009-06-16 14:33:30 +05:30
write ( 6 , * )
2009-08-24 13:46:01 +05:30
write ( 6 , * ) 'Number of nonlocal grains: ' , count ( . not . crystallite_localConstitution )
2009-06-16 14:33:30 +05:30
call flush ( 6 )
!$OMPEND CRITICAL (write2out)
call debug_info ( )
call debug_reset ( )
return
2009-05-07 21:57:36 +05:30
2009-06-16 14:33:30 +05:30
endsubroutine
2009-05-07 21:57:36 +05:30
2009-06-09 16:35:29 +05:30
2009-05-07 21:57:36 +05:30
!********************************************************************
! calculate stress (P) and tangent (dPdF) for crystallites
!********************************************************************
subroutine crystallite_stressAndItsTangent ( updateJaco )
2009-06-16 14:33:30 +05:30
!*** variables and functions from other modules ***!
use prec , only : pInt , &
pReal
2009-10-26 22:13:43 +05:30
use numerics , only : subStepMinCryst , &
2009-11-10 19:06:27 +05:30
subStepSizeCryst , &
stepIncreaseCryst , &
2009-06-16 14:33:30 +05:30
pert_Fg , &
2009-11-10 19:06:27 +05:30
pert_method , &
2010-03-24 21:53:21 +05:30
nCryst , &
2010-10-01 17:48:49 +05:30
iJacoStiffness , &
integratorStiffness , &
integrator
2010-03-17 22:30:54 +05:30
use debug , only : debugger , &
2010-03-24 21:53:21 +05:30
selectiveDebugger , &
verboseDebugger , &
debug_e , &
debug_i , &
debug_g , &
2010-10-01 17:48:49 +05:30
debug_CrystalliteLoopDistribution
2009-06-16 14:33:30 +05:30
use IO , only : IO_warning
use math , only : math_inv3x3 , &
math_mul33x33 , &
math_mul66x6 , &
math_Mandel6to33 , &
math_Mandel33to6 , &
2010-10-01 17:48:49 +05:30
math_I3
2009-06-16 14:33:30 +05:30
use FEsolving , only : FEsolving_execElem , &
FEsolving_execIP , &
2009-12-15 13:50:31 +05:30
theInc , &
cycleCounter
use mesh , only : mesh_element , &
mesh_NcpElems , &
mesh_maxNips
use material , only : homogenization_Ngrains , &
homogenization_maxNgrains
2009-06-16 14:33:30 +05:30
use constitutive , only : constitutive_maxSizeState , &
2009-12-15 13:50:31 +05:30
constitutive_maxSizeDotState , &
2009-06-16 14:33:30 +05:30
constitutive_sizeState , &
2009-08-11 22:01:57 +05:30
constitutive_sizeDotState , &
2009-06-16 14:33:30 +05:30
constitutive_state , &
2010-09-13 14:43:25 +05:30
constitutive_state_backup , &
2009-06-16 14:33:30 +05:30
constitutive_subState0 , &
constitutive_partionedState0 , &
2009-08-11 22:01:57 +05:30
constitutive_homogenizedC , &
constitutive_dotState , &
2010-09-13 14:43:25 +05:30
constitutive_dotState_backup , &
2009-08-11 22:01:57 +05:30
constitutive_collectDotState , &
2009-12-15 13:50:31 +05:30
constitutive_dotTemperature , &
constitutive_microstructure
2009-06-16 14:33:30 +05:30
implicit none
!*** input variables ***!
logical , intent ( in ) :: updateJaco ! flag indicating wehther we want to update the Jacobian (stiffness) or not
!*** output variables ***!
!*** local variables ***!
2009-12-22 17:58:02 +05:30
real ( pReal ) myTemperature , & ! local copy of the temperature
2010-10-01 17:48:49 +05:30
myPert , & ! perturbation with correct sign
formerSubStep
2009-07-22 21:37:19 +05:30
real ( pReal ) , dimension ( 3 , 3 ) :: invFp , & ! inverse of the plastic deformation gradient
2009-06-16 14:33:30 +05:30
Fe_guess , & ! guess for elastic deformation gradient
2009-12-15 13:50:31 +05:30
Tstar ! 2nd Piola-Kirchhoff stress tensor
2009-11-10 19:06:27 +05:30
real ( pReal ) , dimension ( 9 , 9 ) :: dPdF99
2009-12-22 17:58:02 +05:30
real ( pReal ) , dimension ( 3 , 3 , 3 , 3 , 2 ) :: dPdF_perturbation
2009-12-15 13:50:31 +05:30
real ( pReal ) , dimension ( 3 , 3 , homogenization_maxNgrains , mesh_maxNips , mesh_NcpElems ) :: &
2010-09-13 14:43:25 +05:30
F_backup , &
Fp_backup , &
InvFp_backup , &
Fe_backup , &
Lp_backup , &
P_backup
2009-12-15 13:50:31 +05:30
real ( pReal ) , dimension ( 6 , homogenization_maxNgrains , mesh_maxNips , mesh_NcpElems ) :: &
2010-09-13 14:43:25 +05:30
Tstar_v_backup
2009-12-15 13:50:31 +05:30
real ( pReal ) , dimension ( homogenization_maxNgrains , mesh_maxNips , mesh_NcpElems ) :: &
2010-09-13 14:43:25 +05:30
Temperature_backup
2010-10-01 17:48:49 +05:30
integer ( pInt ) NiterationCrystallite , & ! number of iterations in crystallite loop
e , & ! element index
i , & ! integration point index
g , & ! grain index
k , &
l , &
perturbation , & ! loop counter for forward,backward perturbation mode
myNgrains , &
mySizeState , &
mySizeDotState
2009-12-15 13:50:31 +05:30
logical , dimension ( homogenization_maxNgrains , mesh_maxNips , mesh_NcpElems ) :: &
2010-10-01 17:48:49 +05:30
convergenceFlag_backup
2010-03-24 21:53:21 +05:30
logical forceLocalStiffnessCalculation ! flag indicating that stiffness calculation is always done locally
2010-09-06 21:36:41 +05:30
forceLocalStiffnessCalculation = . true .
2010-03-24 21:53:21 +05:30
2009-12-15 13:50:31 +05:30
2010-10-01 17:48:49 +05:30
! --+>> INITIALIZE TO STARTING CONDITION <<+--
2009-11-10 19:06:27 +05:30
2009-12-15 13:50:31 +05:30
crystallite_subStep = 0.0_pReal
2009-06-16 14:33:30 +05:30
!$OMP PARALLEL DO
2010-10-01 17:48:49 +05:30
do e = FEsolving_execElem ( 1 ) , FEsolving_execElem ( 2 ) ! iterate over elements to be processed
2009-06-16 14:33:30 +05:30
myNgrains = homogenization_Ngrains ( mesh_element ( 3 , e ) )
2010-10-01 17:48:49 +05:30
do i = FEsolving_execIP ( 1 , e ) , FEsolving_execIP ( 2 , e ) ! iterate over IPs of this element to be processed
2009-06-16 14:33:30 +05:30
do g = 1 , myNgrains
2010-10-01 17:48:49 +05:30
if ( crystallite_requested ( g , i , e ) ) then ! initialize restoration point of ...
crystallite_subTemperature0 ( g , i , e ) = crystallite_partionedTemperature0 ( g , i , e ) ! ...temperature
constitutive_subState0 ( g , i , e ) % p = constitutive_partionedState0 ( g , i , e ) % p ! ...microstructure
crystallite_subFp0 ( : , : , g , i , e ) = crystallite_partionedFp0 ( : , : , g , i , e ) ! ...plastic def grad
crystallite_subLp0 ( : , : , g , i , e ) = crystallite_partionedLp0 ( : , : , g , i , e ) ! ...plastic velocity grad
crystallite_dPdF0 ( : , : , : , : , g , i , e ) = crystallite_partioneddPdF0 ( : , : , : , : , g , i , e ) ! ...stiffness
crystallite_subF0 ( : , : , g , i , e ) = crystallite_partionedF0 ( : , : , g , i , e ) ! ...def grad
crystallite_subTstar0_v ( : , g , i , e ) = crystallite_partionedTstar0_v ( : , g , i , e ) !...2nd PK stress
2009-06-16 14:33:30 +05:30
crystallite_subFrac ( g , i , e ) = 0.0_pReal
2010-02-23 15:16:39 +05:30
crystallite_subStep ( g , i , e ) = 1.0_pReal / subStepSizeCryst
crystallite_todo ( g , i , e ) = . true .
2010-10-01 17:48:49 +05:30
crystallite_converged ( g , i , e ) = . false . ! pretend failed step of twice the required size
2009-06-16 14:33:30 +05:30
endif
enddo
enddo
enddo
!$OMPEND PARALLEL DO
2010-03-24 21:53:21 +05:30
2009-05-07 21:57:36 +05:30
2010-10-01 17:48:49 +05:30
! --+>> CRYSTALLITE CUTBACK LOOP <<+--
2009-05-07 21:57:36 +05:30
2009-06-16 14:33:30 +05:30
NiterationCrystallite = 0_pInt
2010-10-01 17:48:49 +05:30
do while ( any ( crystallite_subStep ( : , : , FEsolving_execELem ( 1 ) : FEsolving_execElem ( 2 ) ) > subStepMinCryst ) ) ! cutback loop for crystallites
2009-12-22 17:58:02 +05:30
2009-06-16 14:33:30 +05:30
!$OMP PARALLEL DO
2010-10-01 17:48:49 +05:30
do e = FEsolving_execElem ( 1 ) , FEsolving_execElem ( 2 ) ! iterate over elements to be processed
2009-06-16 14:33:30 +05:30
myNgrains = homogenization_Ngrains ( mesh_element ( 3 , e ) )
2010-10-01 17:48:49 +05:30
do i = FEsolving_execIP ( 1 , e ) , FEsolving_execIP ( 2 , e ) ! iterate over IPs of this element to be processed
2009-06-16 14:33:30 +05:30
do g = 1 , myNgrains
2010-02-17 18:51:36 +05:30
selectiveDebugger = ( e == debug_e . and . i == debug_i . and . g == debug_g )
2010-10-01 17:48:49 +05:30
! --- wind forward ---
2009-06-16 14:33:30 +05:30
if ( crystallite_converged ( g , i , e ) ) then
2010-04-29 13:11:29 +05:30
if ( debugger . and . selectiveDebugger ) then
2009-07-22 21:37:19 +05:30
!$OMP CRITICAL (write2out)
2009-12-15 13:50:31 +05:30
write ( 6 , '(a21,f10.8,a32,f10.8,a35)' ) 'winding forward from ' , &
2009-07-22 21:37:19 +05:30
crystallite_subFrac ( g , i , e ) , ' to current crystallite_subfrac ' , &
crystallite_subFrac ( g , i , e ) + crystallite_subStep ( g , i , e ) , ' in crystallite_stressAndItsTangent'
write ( 6 , * )
!$OMPEND CRITICAL (write2out)
endif
2009-06-16 14:33:30 +05:30
crystallite_subFrac ( g , i , e ) = crystallite_subFrac ( g , i , e ) + crystallite_subStep ( g , i , e )
2010-02-23 15:16:39 +05:30
formerSubStep = crystallite_subStep ( g , i , e )
2010-10-01 17:48:49 +05:30
crystallite_subStep ( g , i , e ) = min ( 1.0_pReal - crystallite_subFrac ( g , i , e ) , &
stepIncreaseCryst * crystallite_subStep ( g , i , e ) )
2009-10-26 22:13:43 +05:30
if ( crystallite_subStep ( g , i , e ) > subStepMinCryst ) then
2010-10-01 17:48:49 +05:30
crystallite_subTemperature0 ( g , i , e ) = crystallite_Temperature ( g , i , e ) ! wind forward...
crystallite_subF0 ( : , : , g , i , e ) = crystallite_subF ( : , : , g , i , e ) ! ...def grad
crystallite_subFp0 ( : , : , g , i , e ) = crystallite_Fp ( : , : , g , i , e ) ! ...plastic def grad
crystallite_subLp0 ( : , : , g , i , e ) = crystallite_Lp ( : , : , g , i , e ) ! ...plastic velocity gradient
constitutive_subState0 ( g , i , e ) % p = constitutive_state ( g , i , e ) % p ! ...microstructure
crystallite_subTstar0_v ( : , g , i , e ) = crystallite_Tstar_v ( : , g , i , e ) ! ...2nd PK stress
elseif ( formerSubStep > subStepMinCryst ) then ! this crystallite just converged
2009-08-11 22:01:57 +05:30
!$OMP CRITICAL (distributionCrystallite)
debug_CrystalliteLoopDistribution ( min ( nCryst + 1 , NiterationCrystallite ) ) = &
debug_CrystalliteLoopDistribution ( min ( nCryst + 1 , NiterationCrystallite ) ) + 1
!$OMPEND CRITICAL (distributionCrystallite)
2009-06-16 14:33:30 +05:30
endif
2010-10-01 17:48:49 +05:30
! --- cutback ---
2009-06-16 14:33:30 +05:30
else
2010-10-01 17:48:49 +05:30
crystallite_subStep ( g , i , e ) = subStepSizeCryst * crystallite_subStep ( g , i , e ) ! cut step in half and restore...
crystallite_Temperature ( g , i , e ) = crystallite_subTemperature0 ( g , i , e ) ! ...temperature
crystallite_Fp ( : , : , g , i , e ) = crystallite_subFp0 ( : , : , g , i , e ) ! ...plastic def grad
crystallite_invFp ( : , : , g , i , e ) = math_inv3x3 ( crystallite_Fp ( : , : , g , i , e ) )
crystallite_Lp ( : , : , g , i , e ) = crystallite_subLp0 ( : , : , g , i , e ) ! ...plastic velocity grad
constitutive_state ( g , i , e ) % p = constitutive_subState0 ( g , i , e ) % p ! ...microstructure
crystallite_Tstar_v ( : , g , i , e ) = crystallite_subTstar0_v ( : , g , i , e ) ! ...2nd PK stress
! can<61> t restore dotState here, since not yet calculated in first cutback after initialization
2010-04-29 13:11:29 +05:30
if ( debugger . and . selectiveDebugger ) then
2009-06-16 14:33:30 +05:30
!$OMP CRITICAL (write2out)
2009-07-22 21:37:19 +05:30
write ( 6 , '(a78,f10.8)' ) 'cutback step in crystallite_stressAndItsTangent with new crystallite_subStep: ' , &
crystallite_subStep ( g , i , e )
2009-06-16 14:33:30 +05:30
write ( 6 , * )
!$OMPEND CRITICAL (write2out)
endif
endif
2010-10-01 17:48:49 +05:30
! --- prepare for integration ---
crystallite_todo ( g , i , e ) = crystallite_subStep ( g , i , e ) > subStepMinCryst ! still on track or already done (beyond repair)
if ( crystallite_todo ( g , i , e ) ) then
2009-06-16 14:33:30 +05:30
crystallite_subF ( : , : , g , i , e ) = crystallite_subF0 ( : , : , g , i , e ) + &
2009-08-11 22:01:57 +05:30
crystallite_subStep ( g , i , e ) * &
( crystallite_partionedF ( : , : , g , i , e ) - crystallite_partionedF0 ( : , : , g , i , e ) )
2009-10-07 21:01:52 +05:30
crystallite_Fe ( : , : , g , i , e ) = math_mul33x33 ( crystallite_subF ( : , : , g , i , e ) , crystallite_invFp ( : , : , g , i , e ) )
2009-06-16 14:33:30 +05:30
crystallite_subdt ( g , i , e ) = crystallite_subStep ( g , i , e ) * crystallite_dt ( g , i , e )
2010-10-01 17:48:49 +05:30
crystallite_converged ( g , i , e ) = . false . ! start out non-converged
2009-06-16 14:33:30 +05:30
endif
2010-10-01 17:48:49 +05:30
2009-06-16 14:33:30 +05:30
enddo
enddo
enddo
!$OMPEND PARALLEL DO
2009-12-22 17:58:02 +05:30
2010-10-01 17:48:49 +05:30
! --- integrate ---
2009-12-22 17:58:02 +05:30
2010-10-01 17:48:49 +05:30
if ( any ( crystallite_todo ) ) then
select case ( integrator )
case ( 1 )
call crystallite_integrateStateFPI ( 1 )
case ( 2 )
call crystallite_integrateStateEuler ( 1 )
case ( 3 )
call crystallite_integrateStateAdaptiveEuler ( 1 )
case ( 4 )
call crystallite_integrateStateRK4 ( 1 )
case ( 5 )
call crystallite_integrateStateRKCK45 ( 1 )
endselect
endif
2009-08-24 13:46:01 +05:30
2010-10-01 17:48:49 +05:30
NiterationCrystallite = NiterationCrystallite + 1
enddo ! cutback loop
2009-08-24 13:46:01 +05:30
2010-10-01 17:48:49 +05:30
! --+>> CHECK FOR NON-CONVERGED CRYSTALLITES <<+--
2009-06-16 14:33:30 +05:30
!$OMP PARALLEL DO
2010-10-01 17:48:49 +05:30
do e = FEsolving_execElem ( 1 ) , FEsolving_execElem ( 2 ) ! iterate over elements to be processed
2009-06-16 14:33:30 +05:30
myNgrains = homogenization_Ngrains ( mesh_element ( 3 , e ) )
2010-10-01 17:48:49 +05:30
do i = FEsolving_execIP ( 1 , e ) , FEsolving_execIP ( 2 , e ) ! iterate over IPs of this element to be processed
2009-06-16 14:33:30 +05:30
do g = 1 , myNgrains
2010-10-01 17:48:49 +05:30
if ( . not . crystallite_converged ( g , i , e ) ) then ! respond fully elastically (might be not required due to becoming terminally ill anyway)
2009-08-27 17:40:06 +05:30
! call IO_warning(600,e,i,g)
2009-06-16 14:33:30 +05:30
invFp = math_inv3x3 ( crystallite_partionedFp0 ( : , : , g , i , e ) )
Fe_guess = math_mul33x33 ( crystallite_partionedF ( : , : , g , i , e ) , invFp )
2010-02-19 19:14:38 +05:30
Tstar = math_Mandel6to33 ( math_mul66x6 ( 0.5_pReal * constitutive_homogenizedC ( g , i , e ) , &
math_Mandel33to6 ( math_mul33x33 ( transpose ( Fe_guess ) , Fe_guess ) - math_I3 ) ) )
2009-06-16 14:33:30 +05:30
crystallite_P ( : , : , g , i , e ) = math_mul33x33 ( Fe_guess , math_mul33x33 ( Tstar , transpose ( invFp ) ) )
endif
enddo
enddo
enddo
!$OMPEND PARALLEL DO
2010-10-01 17:48:49 +05:30
! --+>> STIFFNESS CALCULATION <<+--
2009-12-15 13:50:31 +05:30
2010-09-13 14:43:25 +05:30
if ( updateJaco ) then ! Jacobian required
2009-12-15 13:50:31 +05:30
2010-10-01 17:48:49 +05:30
! --- BACKUP ---
2009-12-15 13:50:31 +05:30
2010-09-13 14:43:25 +05:30
do e = FEsolving_execElem ( 1 ) , FEsolving_execElem ( 2 ) ! iterate over elements to be processed
2009-12-15 13:50:31 +05:30
myNgrains = homogenization_Ngrains ( mesh_element ( 3 , e ) )
2010-09-13 14:43:25 +05:30
do i = FEsolving_execIP ( 1 , e ) , FEsolving_execIP ( 2 , e ) ! iterate over IPs of this element to be processed
2009-12-15 13:50:31 +05:30
do g = 1 , myNgrains
2010-09-13 14:43:25 +05:30
mySizeState = constitutive_sizeState ( g , i , e ) ! number of state variables for this grain
mySizeDotState = constitutive_sizeDotState ( g , i , e ) ! number of dotStates for this grain
constitutive_state_backup ( g , i , e ) % p ( 1 : mySizeState ) = &
constitutive_state ( g , i , e ) % p ( 1 : mySizeState ) ! remember unperturbed, converged state, ...
constitutive_dotState_backup ( g , i , e ) % p ( 1 : mySizeDotState ) = &
constitutive_dotState ( g , i , e ) % p ( 1 : mySizeDotState ) ! ... dotStates, ...
2009-12-15 13:50:31 +05:30
enddo ; enddo ; enddo
2010-09-13 14:43:25 +05:30
Temperature_backup = crystallite_Temperature ! ... Temperature, ...
F_backup = crystallite_subF ! ... and kinematics
Fp_backup = crystallite_Fp
InvFp_backup = crystallite_invFp
Fe_backup = crystallite_Fe
Lp_backup = crystallite_Lp
Tstar_v_backup = crystallite_Tstar_v
P_backup = crystallite_P
2010-10-01 17:48:49 +05:30
convergenceFlag_backup = crystallite_converged
2009-12-15 13:50:31 +05:30
2010-10-01 17:48:49 +05:30
! --- LOCAL STIFFNESS CALCULATION ---
2010-03-10 15:23:41 +05:30
if ( all ( crystallite_localConstitution ) . or . theInc < 1 . or . forceLocalStiffnessCalculation ) then ! all grains have local constitution, so local convergence of perturbed grain is sufficient
2009-12-15 13:50:31 +05:30
!$OMP PARALLEL DO
do e = FEsolving_execElem ( 1 ) , FEsolving_execElem ( 2 ) ! iterate over elements to be processed
myNgrains = homogenization_Ngrains ( mesh_element ( 3 , e ) )
do i = FEsolving_execIP ( 1 , e ) , FEsolving_execIP ( 2 , e ) ! iterate over IPs of this element to be processed
do g = 1 , myNgrains
2010-10-01 17:48:49 +05:30
selectiveDebugger = . false . ! (e == debug_e .and. i == debug_i .and. g == debug_g)
2009-12-15 13:50:31 +05:30
if ( crystallite_requested ( g , i , e ) ) then ! first check whether is requested at all!
if ( crystallite_converged ( g , i , e ) ) then ! grain converged in above iteration
2010-10-01 17:48:49 +05:30
if ( verboseDebugger . and . selectiveDebugger ) then
2009-12-15 13:50:31 +05:30
!$OMP CRITICAL (write2out)
write ( 6 , * ) '#############'
write ( 6 , * ) 'central solution of cryst_StressAndTangent'
write ( 6 , * ) '#############'
2010-09-13 14:43:25 +05:30
write ( 6 , '(a8,3(x,i4),/,3(3(f12.4,x)/))' ) ' P of' , g , i , e , P_backup ( 1 : 3 , : , g , i , e ) / 1e6
write ( 6 , '(a8,3(x,i4),/,3(3(f14.9,x)/))' ) ' Fp of' , g , i , e , Fp_backup ( 1 : 3 , : , g , i , e )
write ( 6 , '(a8,3(x,i4),/,3(3(f14.9,x)/))' ) ' Lp of' , g , i , e , Lp_backup ( 1 : 3 , : , g , i , e )
2009-12-15 13:50:31 +05:30
!$OMPEND CRITICAL (write2out)
endif
2010-09-06 21:36:41 +05:30
do perturbation = 1 , 2 ! forward and backward perturbation
if ( iand ( pert_method , perturbation ) > 0 ) then ! mask for desired direction
2010-10-01 17:48:49 +05:30
dPdF_perturbation ( : , : , : , : , perturbation ) = crystallite_dPdF0 ( : , : , : , : , g , i , e ) ! initialize stiffness with known good values from last increment
2010-09-06 21:36:41 +05:30
myPert = - pert_Fg * ( - 1.0_pReal ) ** perturbation ! set perturbation step
do k = 1 , 3 ; do l = 1 , 3 ! ...alter individual components
crystallite_subF ( k , l , g , i , e ) = crystallite_subF ( k , l , g , i , e ) + myPert ! perturb either forward or backward
2010-10-01 17:48:49 +05:30
if ( verboseDebugger . and . selectiveDebugger ) then
2009-12-15 13:50:31 +05:30
!$OMP CRITICAL (write2out)
2010-09-22 14:24:36 +05:30
write ( 6 , '(a,x,i1,x,i1,x,a)' ) '[[[[[[[ Stiffness perturbation' , k , l , ']]]]]]]'
2010-09-06 21:36:41 +05:30
write ( 6 , '(a8,3(x,i4),/,3(3(f14.9,x)/))' ) 'pertF of' , g , i , e , crystallite_subF ( 1 : 3 , : , g , i , e )
2009-12-15 13:50:31 +05:30
!$OMPEND CRITICAL (write2out)
endif
2010-10-01 17:48:49 +05:30
! --- local integration and stiffness calculation ---
crystallite_converged ( g , i , e ) = . false . ! start out non-converged
crystallite_todo ( g , i , e ) = . true .
select case ( integratorStiffness )
case ( 1 )
call crystallite_integrateStateFPI ( 2 , g , i , e )
case ( 2 )
call crystallite_integrateStateEuler ( 2 , g , i , e )
case ( 3 )
call crystallite_integrateStateAdaptiveEuler ( 2 , g , i , e )
case ( 4 )
call crystallite_integrateStateRK4 ( 2 , g , i , e )
case ( 5 )
call crystallite_integrateStateRKCK45 ( 2 , g , i , e )
endselect
if ( crystallite_converged ( g , i , e ) ) & ! converged state warrants stiffness update
2010-09-13 14:43:25 +05:30
dPdF_perturbation ( : , : , k , l , perturbation ) = ( crystallite_P ( : , : , g , i , e ) - P_backup ( : , : , g , i , e ) ) / myPert ! tangent dP_ij/dFg_kl
2010-09-06 21:36:41 +05:30
2010-10-01 17:48:49 +05:30
! --- restore ---
2010-09-13 14:43:25 +05:30
mySizeState = constitutive_sizeState ( g , i , e ) ! number of state variables for this grain
mySizeDotState = constitutive_sizeDotState ( g , i , e ) ! number of dotStates for this grain
constitutive_state ( g , i , e ) % p ( 1 : mySizeState ) = constitutive_state_backup ( g , i , e ) % p ( 1 : mySizeState )
constitutive_dotState ( g , i , e ) % p ( 1 : mySizeDotState ) = constitutive_dotState_backup ( g , i , e ) % p ( 1 : mySizeDotState )
crystallite_Temperature ( g , i , e ) = Temperature_backup ( g , i , e )
crystallite_subF ( : , : , g , i , e ) = F_backup ( : , : , g , i , e )
crystallite_Fp ( : , : , g , i , e ) = Fp_backup ( : , : , g , i , e )
crystallite_invFp ( : , : , g , i , e ) = InvFp_backup ( : , : , g , i , e )
crystallite_Fe ( : , : , g , i , e ) = Fe_backup ( : , : , g , i , e )
crystallite_Lp ( : , : , g , i , e ) = Lp_backup ( : , : , g , i , e )
crystallite_Tstar_v ( : , g , i , e ) = Tstar_v_backup ( : , g , i , e )
crystallite_P ( : , : , g , i , e ) = P_backup ( : , : , g , i , e )
2010-10-01 17:48:49 +05:30
crystallite_converged ( g , i , e ) = convergenceFlag_backup ( g , i , e )
2009-12-22 17:58:02 +05:30
enddo ; enddo
endif
2010-09-13 14:43:25 +05:30
enddo ! perturbation direction
2009-12-22 17:58:02 +05:30
select case ( pert_method )
case ( 1 )
2010-03-24 21:53:21 +05:30
crystallite_dPdF ( : , : , : , : , g , i , e ) = dPdF_perturbation ( : , : , : , : , 1 )
2009-12-22 17:58:02 +05:30
case ( 2 )
2010-03-24 21:53:21 +05:30
crystallite_dPdF ( : , : , : , : , g , i , e ) = dPdF_perturbation ( : , : , : , : , 2 )
2009-12-22 17:58:02 +05:30
case ( 3 )
2010-03-24 21:53:21 +05:30
crystallite_dPdF ( : , : , : , : , g , i , e ) = 0.5_pReal * ( dPdF_perturbation ( : , : , : , : , 1 ) + dPdF_perturbation ( : , : , : , : , 2 ) )
2009-12-22 17:58:02 +05:30
end select
2009-12-15 13:50:31 +05:30
else ! grain did not converge
crystallite_dPdF ( : , : , : , : , g , i , e ) = crystallite_fallbackdPdF ( : , : , : , : , g , i , e ) ! use (elastic) fallback
endif ! grain convergence
endif ! grain request
enddo ! grain loop
enddo ! ip loop
enddo ! element loop
!$OMPEND PARALLEL DO
2010-10-01 17:48:49 +05:30
! --- NON-LOCAL STIFFNESS CALCULATION ---
2010-03-24 21:53:21 +05:30
elseif ( any ( . not . crystallite_localConstitution ) ) then ! if any nonlocal grain present, we have to do a full loop over all grains after each perturbance
2009-12-15 13:50:31 +05:30
2010-10-01 17:48:49 +05:30
crystallite_dPdF = crystallite_dPdF0 ! initialize stiffness with known good values from last inc
2010-06-17 12:02:56 +05:30
do k = 1 , 3
do l = 1 , 3
crystallite_subF ( k , l , : , : , : ) = crystallite_subF ( k , l , : , : , : ) + pert_Fg ! perturb single component
2010-10-01 17:48:49 +05:30
! --- integration ---
crystallite_converged = . false . ! start out non-converged
2010-06-17 12:02:56 +05:30
crystallite_todo = . true .
2010-10-01 17:48:49 +05:30
select case ( integratorStiffness )
case ( 1 )
call crystallite_integrateStateFPI ( 2 )
case ( 2 )
call crystallite_integrateStateEuler ( 2 )
case ( 3 )
call crystallite_integrateStateAdaptiveEuler ( 2 )
case ( 4 )
call crystallite_integrateStateRK4 ( 2 )
case ( 5 )
call crystallite_integrateStateRKCK45 ( 2 )
endselect
! --- stiffness calculation ---
2010-06-17 12:02:56 +05:30
2010-03-04 22:57:39 +05:30
do e = FEsolving_execElem ( 1 ) , FEsolving_execElem ( 2 )
myNgrains = homogenization_Ngrains ( mesh_element ( 3 , e ) )
do i = FEsolving_execIP ( 1 , e ) , FEsolving_execIP ( 2 , e )
do g = 1 , myNgrains
2010-08-04 05:17:00 +05:30
if ( crystallite_converged ( g , i , e ) ) then ! if stiffness calculation converged...
2010-09-13 14:43:25 +05:30
crystallite_dPdF ( : , : , k , l , g , i , e ) = ( crystallite_P ( : , : , g , i , e ) - P_backup ( : , : , g , i , e ) ) / pert_Fg ! ... use tangent dP_ij/dFg_kl
2010-10-01 17:48:49 +05:30
elseif ( . not . convergenceFlag_backup ( g , i , e ) ) then ! if crystallite didn t converge before...
2010-08-04 05:17:00 +05:30
crystallite_dPdF ( : , : , : , : , g , i , e ) = crystallite_fallbackdPdF ( : , : , : , : , g , i , e ) ! ... use (elastic) fallback
2010-03-04 22:57:39 +05:30
endif
enddo ; enddo ; enddo
2010-10-01 17:48:49 +05:30
! --- restore ---
2010-03-04 22:57:39 +05:30
do e = FEsolving_execElem ( 1 ) , FEsolving_execElem ( 2 )
myNgrains = homogenization_Ngrains ( mesh_element ( 3 , e ) )
do i = FEsolving_execIP ( 1 , e ) , FEsolving_execIP ( 2 , e )
do g = 1 , myNgrains
2010-06-17 12:02:56 +05:30
mySizeState = constitutive_sizeState ( g , i , e )
mySizeDotState = constitutive_sizeDotState ( g , i , e )
2010-09-13 14:43:25 +05:30
constitutive_state ( g , i , e ) % p ( 1 : mySizeState ) = constitutive_state_backup ( g , i , e ) % p ( 1 : mySizeState )
constitutive_dotState ( g , i , e ) % p ( 1 : mySizeDotState ) = constitutive_dotState_backup ( g , i , e ) % p ( 1 : mySizeDotState )
2010-03-04 22:57:39 +05:30
enddo ; enddo ; enddo
2010-09-13 14:43:25 +05:30
crystallite_Temperature = Temperature_backup
crystallite_subF = F_backup
crystallite_Fp = Fp_backup
crystallite_invFp = InvFp_backup
crystallite_Fe = Fe_backup
crystallite_Lp = Lp_backup
crystallite_Tstar_v = Tstar_v_backup
crystallite_P = P_backup
2010-10-01 17:48:49 +05:30
crystallite_converged = convergenceFlag_backup
2010-03-04 22:57:39 +05:30
2010-06-17 12:02:56 +05:30
enddo ; enddo ! k,l loop
2009-12-15 13:50:31 +05:30
endif
2009-06-16 14:33:30 +05:30
2009-08-27 17:40:06 +05:30
endif ! jacobian calculation
2009-05-07 21:57:36 +05:30
2009-05-28 22:08:40 +05:30
endsubroutine
2009-05-07 21:57:36 +05:30
2009-07-22 21:37:19 +05:30
!********************************************************************
2010-10-01 17:48:49 +05:30
! integrate stress, state and Temperature with
! 4h order explicit Runge Kutta method
2009-07-22 21:37:19 +05:30
!********************************************************************
2010-10-01 17:48:49 +05:30
subroutine crystallite_integrateStateRK4 ( mode , gg , ii , ee )
2009-07-22 21:37:19 +05:30
2010-10-01 17:48:49 +05:30
!*** variables and functions from other modules ***!
use prec , only : pInt , &
pReal
use debug , only : debugger , &
selectiveDebugger , &
verboseDebugger , &
debug_e , &
debug_i , &
debug_g , &
debug_StateLoopDistribution
use FEsolving , only : FEsolving_execElem , &
FEsolving_execIP
use mesh , only : mesh_element , &
mesh_NcpElems , &
mesh_maxNips
use material , only : homogenization_Ngrains , &
homogenization_maxNgrains
use constitutive , only : constitutive_sizeDotState , &
constitutive_state , &
constitutive_subState0 , &
constitutive_dotState , &
constitutive_RK4dotState , &
constitutive_collectDotState , &
constitutive_dotTemperature , &
constitutive_microstructure
2009-12-15 13:50:31 +05:30
2010-10-01 17:48:49 +05:30
implicit none
2009-07-22 21:37:19 +05:30
2010-10-01 17:48:49 +05:30
real ( pReal ) , dimension ( 4 ) , parameter :: timeStepFraction = ( / 0.5_pReal , 0.5_pReal , 1.0_pReal , 1.0_pReal / ) ! weight of slope used for Runge Kutta integration
real ( pReal ) , dimension ( 3 ) , parameter :: weight = ( / 2.0_pReal , 2.0_pReal , 1.0_pReal / ) ! factor giving the fraction of the original timestep used for Runge Kutta Integration
2009-07-22 21:37:19 +05:30
2010-10-01 17:48:49 +05:30
!*** input variables ***!
integer ( pInt ) , intent ( in ) :: mode ! mode of calculation; 1: central solution, 2: stiffness (by perturbation)
integer ( pInt ) , optional , intent ( in ) :: ee , & ! element index
ii , & ! integration point index
gg ! grain index
2009-07-22 21:37:19 +05:30
2010-10-01 17:48:49 +05:30
!*** output variables ***!
2009-07-22 21:37:19 +05:30
2010-10-01 17:48:49 +05:30
!*** local variables ***!
integer ( pInt ) e , & ! element index in element loop
i , & ! integration point index in ip loop
g , & ! grain index in grain loop
n , &
mySizeDotState
integer ( pInt ) , dimension ( 2 ) :: eIter ! bounds for element iteration
integer ( pInt ) , dimension ( 2 , mesh_NcpElems ) :: iIter , & ! bounds for ip iteration
gIter ! bounds for grain iteration
real ( pReal ) , dimension ( homogenization_maxNgrains , mesh_maxNips , mesh_NcpElems ) :: &
RK4dotTemperature ! evolution of Temperature of each grain for Runge Kutta integration
logical singleRun ! flag indicating computation for single (g,i,e) triple
if ( present ( ee ) . and . present ( ii ) . and . present ( gg ) ) then
eIter = ee
iIter ( : , ee ) = ii
gIter ( : , ee ) = gg
singleRun = . true .
else
eIter = FEsolving_execElem ( 1 : 2 )
do e = eIter ( 1 ) , eIter ( 2 )
iIter ( : , e ) = FEsolving_execIP ( 1 : 2 , e )
gIter ( : , e ) = ( / 1 , homogenization_Ngrains ( mesh_element ( 3 , e ) ) / )
enddo
singleRun = . false .
endif
! --- UPDATE DEPENDENT STATES ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
call constitutive_microstructure ( crystallite_Temperature ( g , i , e ) , crystallite_Tstar_v ( : , g , i , e ) , crystallite_Fe , &
crystallite_Fp , crystallite_disorientation ( : , : , g , i , e ) , g , i , e ) ! update dependent state variables to be consistent with basic states
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- FIRST RUNGE KUTTA STEP ---
RK4dotTemperature = 0.0_pReal
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
selectiveDebugger = . false . !(e == debug_e .and. i == debug_i .and. g == debug_g)
call constitutive_collectDotState ( crystallite_Tstar_v ( : , g , i , e ) , crystallite_subTstar0_v ( : , g , i , e ) , &
crystallite_Fe , crystallite_Fp , crystallite_Temperature ( g , i , e ) , &
crystallite_disorientation ( : , : , g , i , e ) , crystallite_subdt ( g , i , e ) , g , i , e )
crystallite_dotTemperature ( g , i , e ) = constitutive_dotTemperature ( crystallite_Tstar_v ( : , g , i , e ) , &
crystallite_Temperature ( g , i , e ) , g , i , e )
if ( any ( constitutive_dotState ( g , i , e ) % p / = constitutive_dotState ( g , i , e ) % p ) & ! NaN occured in dotState
. or . crystallite_dotTemperature ( g , i , e ) / = crystallite_dotTemperature ( g , i , e ) ) then ! NaN occured in dotTemperature
if ( . not . crystallite_localConstitution ( g , i , e ) ) then ! if broken non-local...
!$OMP CRITICAL
crystallite_todo = crystallite_todo . and . crystallite_localConstitution ! ...all non-locals skipped
!$OMPEND CRITICAL
else ! if broken local...
crystallite_todo ( g , i , e ) = . false . ! ... skip this one next time
endif
else ! everything is fine
constitutive_RK4dotState ( g , i , e ) % p = constitutive_dotState ( g , i , e ) % p ! initial contribution to RK slope
RK4dotTemperature ( g , i , e ) = crystallite_dotTemperature ( g , i , e )
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- SECOND TO FOURTH RUNGE KUTTA STEP PLUS FINAL INTEGRATION ---
do n = 1 , 4
! --- state update ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
mySizeDotState = constitutive_sizeDotState ( g , i , e )
constitutive_state ( g , i , e ) % p ( 1 : mySizeDotState ) = constitutive_subState0 ( g , i , e ) % p ( 1 : mySizeDotState ) &
+ constitutive_dotState ( g , i , e ) % p ( 1 : mySizeDotState ) * crystallite_subdt ( g , i , e ) * timeStepFraction ( n )
crystallite_Temperature ( g , i , e ) = crystallite_subTemperature0 ( g , i , e ) &
+ crystallite_dotTemperature ( g , i , e ) * crystallite_subdt ( g , i , e ) * timeStepFraction ( n )
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- update dependent states ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
call constitutive_microstructure ( crystallite_Temperature ( g , i , e ) , crystallite_Tstar_v ( : , g , i , e ) , crystallite_Fe , &
crystallite_Fp , crystallite_disorientation ( : , : , g , i , e ) , g , i , e ) ! update dependent state variables to be consistent with basic states
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- stress integration ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
selectiveDebugger = . false . !(e == debug_e .and. i == debug_i .and. g == debug_g)
if ( crystallite_integrateStress ( mode , g , i , e , timeStepFraction ( n ) ) ) then ! fraction of original times step
if ( n == 4 ) then ! final integration step
if ( mode == 1 . and . verboseDebugger . and . e == debug_e . and . i == debug_i . and . g == debug_g ) then
mySizeDotState = constitutive_sizeDotState ( g , i , e )
!$OMP CRITICAL (write2out)
write ( 6 , * ) '::: updateState' , g , i , e
write ( 6 , * )
write ( 6 , '(a,/,12(e14.8,x))' ) 'updateState: dotState' , constitutive_dotState ( g , i , e ) % p ( 1 : mySizeDotState )
write ( 6 , * )
write ( 6 , '(a,/,12(e14.8,x))' ) 'updateState: new state' , constitutive_state ( g , i , e ) % p ( 1 : mySizeDotState )
write ( 6 , * )
!$OMPEND CRITICAL (write2out)
endif
crystallite_converged ( g , i , e ) = . true . ! ... converged per definition
crystallite_todo ( g , i , e ) = . false . ! ... integration done
!$OMP CRITICAL (distributionState)
debug_StateLoopDistribution ( n , mode ) = debug_StateLoopDistribution ( n , mode ) + 1
!$OMPEND CRITICAL (distributionState)
endif
else ! broken stress integration
if ( . not . crystallite_localConstitution ( g , i , e ) ) then ! if broken non-local...
!$OMP CRITICAL
crystallite_todo = crystallite_todo . and . crystallite_localConstitution ! ...all non-locals skipped
!$OMPEND CRITICAL
else ! if broken local...
crystallite_todo ( g , i , e ) = . false . ! ... skip this one next time
endif
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- dot state and RK dot state---
if ( n < 4 ) then
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
selectiveDebugger = . false . !(e == debug_e .and. i == debug_i .and. g == debug_g)
call constitutive_collectDotState ( crystallite_Tstar_v ( : , g , i , e ) , crystallite_subTstar0_v ( : , g , i , e ) , &
crystallite_Fe , crystallite_Fp , crystallite_Temperature ( g , i , e ) , &
crystallite_disorientation ( : , : , g , i , e ) , &
timeStepFraction ( n ) * crystallite_subdt ( g , i , e ) , g , i , e ) ! fraction of original timestep
crystallite_dotTemperature ( g , i , e ) = constitutive_dotTemperature ( crystallite_Tstar_v ( : , g , i , e ) , &
crystallite_Temperature ( g , i , e ) , g , i , e )
if ( any ( constitutive_dotState ( g , i , e ) % p / = constitutive_dotState ( g , i , e ) % p ) & ! NaN occured in dotState
. or . crystallite_dotTemperature ( g , i , e ) / = crystallite_dotTemperature ( g , i , e ) ) then ! NaN occured in dotTemperature
if ( . not . crystallite_localConstitution ( g , i , e ) ) then ! if broken non-local...
!$OMP CRITICAL
crystallite_todo = crystallite_todo . and . crystallite_localConstitution ! ...all non-locals skipped
!$OMPEND CRITICAL
else ! if broken local...
crystallite_todo ( g , i , e ) = . false . ! ... skip this one next time
endif
else ! everything is fine
constitutive_RK4dotState ( g , i , e ) % p = constitutive_RK4dotState ( g , i , e ) % p + weight ( n ) * constitutive_dotState ( g , i , e ) % p
RK4dotTemperature ( g , i , e ) = RK4dotTemperature ( g , i , e ) + weight ( n ) * crystallite_dotTemperature ( g , i , e )
if ( n == 3 ) then
constitutive_dotState ( g , i , e ) % p = constitutive_RK4dotState ( g , i , e ) % p / 6.0_pReal ! use weighted RKdotState for final integration
endif
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
endif
enddo
! --- CHECK CONVERGENCE ---
crystallite_todo = . false . ! done with integration
if ( . not . ( mode == 2 . and . singleRun ) & ! except for local stiffness calculation:
. and . any ( . not . crystallite_converged . and . . not . crystallite_localConstitution ) ) then ! any non-local not yet converged (or broken)...
crystallite_converged = crystallite_converged . and . crystallite_localConstitution ! ...restart all non-local as not converged
endif
endsubroutine
!********************************************************************
! integrate stress, state and Temperature with
! 5th order Runge-Kutta Cash-Karp method with adaptive step size
! (use 5th order solution to advance = "local extrapolation")
!********************************************************************
subroutine crystallite_integrateStateRKCK45 ( mode , gg , ii , ee )
!*** variables and functions from other modules ***!
use prec , only : pInt , &
pReal
use debug , only : debugger , &
selectiveDebugger , &
verboseDebugger , &
debug_e , &
debug_i , &
debug_g , &
debug_StateLoopDistribution
use numerics , only : rTol_crystalliteState , &
rTol_crystalliteTemperature , &
subStepSizeCryst , &
stepIncreaseCryst
use FEsolving , only : FEsolving_execElem , &
FEsolving_execIP
use mesh , only : mesh_element , &
mesh_NcpElems , &
mesh_maxNips
use material , only : homogenization_Ngrains , &
homogenization_maxNgrains
use constitutive , only : constitutive_sizeDotState , &
constitutive_maxSizeDotState , &
constitutive_state , &
constitutive_relevantState , &
constitutive_subState0 , &
constitutive_dotState , &
constitutive_RKCK45dotState , &
constitutive_collectDotState , &
constitutive_dotTemperature , &
constitutive_microstructure
implicit none
!*** input variables ***!
integer ( pInt ) , intent ( in ) :: mode ! mode of calculation; 1: central solution, 2: stiffness (by perturbation)
integer ( pInt ) , optional , intent ( in ) :: ee , & ! element index
ii , & ! integration point index
gg ! grain index
!*** output variables ***!
!*** local variables ***!
integer ( pInt ) e , & ! element index in element loop
i , & ! integration point index in ip loop
g , & ! grain index in grain loop
j , &
n , & ! stage index in integration stage loop
sizeDotState , & ! size of dot State
s ! state index
integer ( pInt ) , dimension ( 2 ) :: eIter ! bounds for element iteration
integer ( pInt ) , dimension ( 2 , mesh_NcpElems ) :: iIter , & ! bounds for ip iteration
gIter ! bounds for grain iteration
real ( pReal ) , dimension ( 6 , homogenization_maxNgrains , mesh_maxNips , mesh_NcpElems ) :: &
RKCK45dotTemperature ! evolution of Temperature of each grain for Runge Kutta Cash Karp integration
real ( pReal ) , dimension ( 5 , 5 ) :: a ! coefficients in Butcher tableau (used for preliminary integration in stages 2 to 6)
real ( pReal ) , dimension ( 6 ) :: b , db ! coefficients in Butcher tableau (used for final integration and error estimate)
real ( pReal ) , dimension ( 5 ) :: c ! coefficients in Butcher tableau (fractions of original time step in stages 2 to 6)
real ( pReal ) , dimension ( constitutive_maxSizeDotState , homogenization_maxNgrains , mesh_maxNips , mesh_NcpElems ) :: &
stateResiduum , & ! residuum from evolution in micrstructure
relStateResiduum ! relative residuum from evolution in microstructure
real ( pReal ) , dimension ( homogenization_maxNgrains , mesh_maxNips , mesh_NcpElems ) :: &
temperatureResiduum , & ! residuum from evolution in temperature
relTemperatureResiduum ! relative residuum from evolution in temperature
logical singleRun ! flag indicating computation for single (g,i,e) triple
! --- FILL BUTCHER TABLEAU ---
a = 0.0_pReal
b = 0.0_pReal
db = 0.0_pReal
c = 0.0_pReal
a ( 1 , 1 ) = 0.2_pReal
a ( 1 , 2 ) = 0.075_pReal
a ( 2 , 2 ) = 0.225_pReal
a ( 1 , 3 ) = 0.3_pReal
a ( 2 , 3 ) = - 0.9_pReal
a ( 3 , 3 ) = 1.2_pReal
a ( 1 , 4 ) = - 1 1.0_pReal / 5 4.0_pReal
a ( 2 , 4 ) = 2.5_pReal
a ( 3 , 4 ) = - 7 0.0_pReal / 2 7.0_pReal
a ( 4 , 4 ) = 3 5.0_pReal / 2 7.0_pReal
a ( 1 , 5 ) = 163 1.0_pReal / 5529 6.0_pReal
a ( 2 , 5 ) = 17 5.0_pReal / 51 2.0_pReal
a ( 3 , 5 ) = 57 5.0_pReal / 1382 4.0_pReal
a ( 4 , 5 ) = 4427 5.0_pReal / 11059 2.0_pReal
a ( 5 , 5 ) = 25 3.0_pReal / 409 6.0_pReal
b ( 1 ) = 3 7.0_pReal / 37 8.0_pReal
b ( 3 ) = 25 0.0_pReal / 62 1.0_pReal
b ( 4 ) = 12 5.0_pReal / 59 4.0_pReal
b ( 6 ) = 51 2.0_pReal / 177 1.0_pReal
db ( 1 ) = b ( 1 ) - 282 5.0_pReal / 2764 8.0_pReal
db ( 3 ) = b ( 3 ) - 1857 5.0_pReal / 4838 4.0_pReal
db ( 4 ) = b ( 4 ) - 1352 5.0_pReal / 5529 6.0_pReal
db ( 5 ) = - 27 7.0_pReal / 1433 6.0_pReal
db ( 6 ) = b ( 6 ) - 0.25_pReal
c ( 1 ) = 0.2_pReal
c ( 2 ) = 0.3_pReal
c ( 3 ) = 0.6_pReal
c ( 4 ) = 1.0_pReal
c ( 5 ) = 0.875_pReal
! --- LOOP ITERATOR FOR ELEMENT, GRAIN, IP ---
if ( present ( ee ) . and . present ( ii ) . and . present ( gg ) ) then
eIter = ee
iIter ( : , ee ) = ii
gIter ( : , ee ) = gg
singleRun = . true .
else
eIter = FEsolving_execElem ( 1 : 2 )
do e = eIter ( 1 ) , eIter ( 2 )
iIter ( : , e ) = FEsolving_execIP ( 1 : 2 , e )
gIter ( : , e ) = ( / 1 , homogenization_Ngrains ( mesh_element ( 3 , e ) ) / )
enddo
singleRun = . false .
endif
! --- UPDATE DEPENDENT STATES ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
call constitutive_microstructure ( crystallite_Temperature ( g , i , e ) , crystallite_Tstar_v ( : , g , i , e ) , crystallite_Fe , &
crystallite_Fp , crystallite_disorientation ( : , : , g , i , e ) , g , i , e ) ! update dependent state variables to be consistent with basic states
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- FIRST RUNGE KUTTA STEP ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
selectiveDebugger = . false . !(e == debug_e .and. i == debug_i .and. g == debug_g)
call constitutive_collectDotState ( crystallite_Tstar_v ( : , g , i , e ) , crystallite_subTstar0_v ( : , g , i , e ) , &
crystallite_Fe , crystallite_Fp , crystallite_Temperature ( g , i , e ) , &
crystallite_disorientation ( : , : , g , i , e ) , crystallite_subdt ( g , i , e ) , g , i , e )
crystallite_dotTemperature ( g , i , e ) = constitutive_dotTemperature ( crystallite_Tstar_v ( : , g , i , e ) , &
crystallite_Temperature ( g , i , e ) , g , i , e )
if ( any ( constitutive_dotState ( g , i , e ) % p / = constitutive_dotState ( g , i , e ) % p ) & ! NaN occured in dotState
. or . crystallite_dotTemperature ( g , i , e ) / = crystallite_dotTemperature ( g , i , e ) ) then ! NaN occured in dotTemperature
if ( . not . crystallite_localConstitution ( g , i , e ) ) then ! if broken non-local...
!$OMP CRITICAL
crystallite_todo = crystallite_todo . and . crystallite_localConstitution ! ...all non-locals skipped
!$OMPEND CRITICAL
else ! if broken local...
crystallite_todo ( g , i , e ) = . false . ! ... skip this one next time
endif
else ! everything is fine
constitutive_RKCK45dotState ( 1 , g , i , e ) % p = constitutive_dotState ( g , i , e ) % p ! initial contribution to RK slope
RKCK45dotTemperature ( 1 , g , i , e ) = crystallite_dotTemperature ( g , i , e )
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- SECOND TO SIXTH RUNGE KUTTA STEP ---
do n = 1 , 5
! --- state update ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
sizeDotState = constitutive_sizeDotState ( g , i , e )
constitutive_dotState ( g , i , e ) % p = 0.0_pReal
crystallite_dotTemperature ( g , i , e ) = 0.0_pReal
do j = 1 , n
constitutive_dotState ( g , i , e ) % p = constitutive_dotState ( g , i , e ) % p + a ( j , n ) * constitutive_RKCK45dotState ( j , g , i , e ) % p
crystallite_dotTemperature ( g , i , e ) = crystallite_dotTemperature ( g , i , e ) + a ( j , n ) * RKCK45dotTemperature ( j , g , i , e )
enddo
constitutive_state ( g , i , e ) % p ( 1 : sizeDotState ) = constitutive_subState0 ( g , i , e ) % p ( 1 : sizeDotState ) &
+ constitutive_dotState ( g , i , e ) % p ( 1 : sizeDotState ) * crystallite_subdt ( g , i , e )
crystallite_Temperature ( g , i , e ) = crystallite_subTemperature0 ( g , i , e ) &
+ crystallite_dotTemperature ( g , i , e ) * crystallite_subdt ( g , i , e )
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- update dependent states ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
call constitutive_microstructure ( crystallite_Temperature ( g , i , e ) , crystallite_Tstar_v ( : , g , i , e ) , crystallite_Fe , &
crystallite_Fp , crystallite_disorientation ( : , : , g , i , e ) , g , i , e ) ! update dependent state variables to be consistent with basic states
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- stress integration ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
selectiveDebugger = . false . !(e == debug_e .and. i == debug_i .and. g == debug_g .and. mode == 1)
if ( crystallite_todo ( g , i , e ) ) then
if ( . not . crystallite_integrateStress ( mode , g , i , e , c ( n ) ) ) then ! fraction of original time step
if ( . not . crystallite_localConstitution ( g , i , e ) ) then ! if broken non-local...
!$OMP CRITICAL
crystallite_todo = crystallite_todo . and . crystallite_localConstitution ! ...all non-locals skipped
!$OMPEND CRITICAL
else ! if broken local...
crystallite_todo ( g , i , e ) = . false . ! ... skip this one next time
endif
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- dot state and RK dot state---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
selectiveDebugger = . false . !(e == debug_e .and. i == debug_i .and. g == debug_g)
if ( crystallite_todo ( g , i , e ) ) then
call constitutive_collectDotState ( crystallite_Tstar_v ( : , g , i , e ) , crystallite_subTstar0_v ( : , g , i , e ) , &
crystallite_Fe , crystallite_Fp , crystallite_Temperature ( g , i , e ) , &
crystallite_disorientation ( : , : , g , i , e ) , c ( n ) * crystallite_subdt ( g , i , e ) , g , i , e ) ! fraction of original timestep
crystallite_dotTemperature ( g , i , e ) = constitutive_dotTemperature ( crystallite_Tstar_v ( : , g , i , e ) , &
crystallite_Temperature ( g , i , e ) , g , i , e )
if ( any ( constitutive_dotState ( g , i , e ) % p / = constitutive_dotState ( g , i , e ) % p ) & ! NaN occured in dotState
. or . crystallite_dotTemperature ( g , i , e ) / = crystallite_dotTemperature ( g , i , e ) ) then ! NaN occured in dotTemperature
if ( . not . crystallite_localConstitution ( g , i , e ) ) then ! if broken non-local...
!$OMP CRITICAL
crystallite_todo = crystallite_todo . and . crystallite_localConstitution ! ...all non-locals skipped
!$OMPEND CRITICAL
else ! if broken local...
crystallite_todo ( g , i , e ) = . false . ! ... skip this one next time
endif
else ! everything is fine
constitutive_RKCK45dotState ( n + 1 , g , i , e ) % p = constitutive_dotState ( g , i , e ) % p
RKCK45dotTemperature ( n + 1 , g , i , e ) = crystallite_dotTemperature ( g , i , e )
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
enddo
! --- STATE UPDATE WITH ERROR ESTIMATE FOR STATE AND TEMPERATURE ---
stateResiduum = 0.0_pReal
temperatureResiduum = 0.0_pReal
relStateResiduum = 0.0_pReal
relTemperatureResiduum = 0.0_pReal
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
selectiveDebugger = ( e == debug_e . and . i == debug_i . and . g == debug_g . and . mode == 1 )
sizeDotState = constitutive_sizeDotState ( g , i , e )
! --- absolute residuum in state and temperature ---
do j = 1 , 6
stateResiduum ( 1 : sizeDotState , g , i , e ) = stateResiduum ( 1 : sizeDotState , g , i , e ) &
+ db ( j ) * constitutive_RKCK45dotState ( j , g , i , e ) % p ( 1 : sizeDotState ) * crystallite_subdt ( g , i , e )
temperatureResiduum ( g , i , e ) = temperatureResiduum ( g , i , e ) + db ( j ) * RKCK45dotTemperature ( j , g , i , e ) * crystallite_subdt ( g , i , e )
enddo
! --- dot state and dot temperature ---
constitutive_dotState ( g , i , e ) % p = 0.0_pReal
crystallite_dotTemperature ( g , i , e ) = 0.0_pReal
do j = 1 , 6
constitutive_dotState ( g , i , e ) % p = constitutive_dotState ( g , i , e ) % p + b ( j ) * constitutive_RKCK45dotState ( j , g , i , e ) % p
crystallite_dotTemperature ( g , i , e ) = crystallite_dotTemperature ( g , i , e ) + b ( j ) * RKCK45dotTemperature ( j , g , i , e )
enddo
! --- state and temperature update and relative residui ---
constitutive_state ( g , i , e ) % p ( 1 : sizeDotState ) = constitutive_subState0 ( g , i , e ) % p ( 1 : sizeDotState ) &
+ constitutive_dotState ( g , i , e ) % p ( 1 : sizeDotState ) * crystallite_subdt ( g , i , e )
crystallite_Temperature ( g , i , e ) = crystallite_subTemperature0 ( g , i , e ) &
+ crystallite_dotTemperature ( g , i , e ) * crystallite_subdt ( g , i , e )
forall ( s = 1 : sizeDotState , constitutive_state ( g , i , e ) % p ( s ) > constitutive_relevantState ( g , i , e ) % p ( s ) ) &
relStateResiduum ( s , g , i , e ) = abs ( stateResiduum ( s , g , i , e ) ) / constitutive_state ( g , i , e ) % p ( s ) / rTol_crystalliteState
if ( crystallite_Temperature ( g , i , e ) > 0 ) &
relTemperatureResiduum ( g , i , e ) = abs ( temperatureResiduum ( g , i , e ) ) / crystallite_Temperature ( g , i , e ) &
/ rTol_crystalliteTemperature
if ( verboseDebugger . and . selectiveDebugger ) then
!$OMP CRITICAL (write2out)
write ( 6 , * ) '::: updateState' , g , i , e
write ( 6 , * )
write ( 6 , '(a,/,12(f12.1,x))' ) 'updateState: absolute residuum' , stateResiduum ( 1 : sizeDotState , g , i , e )
write ( 6 , * )
write ( 6 , '(a,/,12(f12.1,x))' ) 'updateState: resid tolerance' , relStateResiduum ( 1 : sizeDotState , g , i , e )
write ( 6 , * )
! write(6,'(a)') 'updateState: RKCK45dotState'
! do j = 1,6
! write(6,'(12(e14.8,x))') constitutive_RKCK45dotState(j,g,i,e)%p(1:sizeDotState)
! write(6,*)
! enddo
write ( 6 , '(a,/,12(e14.8,x))' ) 'updateState: dotState' , constitutive_dotState ( g , i , e ) % p ( 1 : sizeDotState )
write ( 6 , * )
write ( 6 , '(a,/,12(e14.8,x))' ) 'updateState: new state' , constitutive_state ( g , i , e ) % p ( 1 : sizeDotState )
write ( 6 , * )
!$OMPEND CRITICAL (write2out)
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- UPDATE DEPENDENT STATES IF RESIDUUM BELOW TOLERANCE ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
sizeDotState = constitutive_sizeDotState ( g , i , e )
if ( all ( relStateResiduum ( 1 : sizeDotState , g , i , e ) < 1.0_pReal ) . and . relTemperatureResiduum ( g , i , e ) < 1.0_pReal ) then
call constitutive_microstructure ( crystallite_Temperature ( g , i , e ) , crystallite_Tstar_v ( : , g , i , e ) , crystallite_Fe , &
crystallite_Fp , crystallite_disorientation ( : , : , g , i , e ) , g , i , e ) ! update dependent state variables to be consistent with basic states
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- FINAL STRESS INTEGRATION STEP IF RESIDUUM BELOW TOLERANCE ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
selectiveDebugger = . false . !(e == debug_e .and. i == debug_i .and. g == debug_g .and. mode==1)
sizeDotState = constitutive_sizeDotState ( g , i , e )
if ( all ( relStateResiduum ( 1 : sizeDotState , g , i , e ) < 1.0_pReal ) . and . relTemperatureResiduum ( g , i , e ) < 1.0_pReal ) then
if ( crystallite_integrateStress ( mode , g , i , e ) ) then
crystallite_converged ( g , i , e ) = . true . ! ... converged per definitionem
crystallite_todo ( g , i , e ) = . false . ! ... integration done
!$OMP CRITICAL (distributionState)
debug_StateLoopDistribution ( 6 , mode ) = debug_StateLoopDistribution ( 6 , mode ) + 1
!$OMPEND CRITICAL (distributionState)
else
if ( . not . crystallite_localConstitution ( g , i , e ) ) then ! if broken non-local...
!$OMP CRITICAL
crystallite_todo = crystallite_todo . and . crystallite_localConstitution ! ...all non-locals skipped
!$OMPEND CRITICAL
endif
endif
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- nonlocal convergence check ---
if ( verboseDebugger . and . mode == 1 ) write ( 6 , * ) 'crystallite_converged' , crystallite_converged
if ( . not . ( mode == 2 . and . singleRun ) ) then ! except for local stiffness calculation:
if ( any ( . not . crystallite_converged . and . . not . crystallite_localConstitution ) ) then ! any non-local not yet converged (or broken)...
crystallite_converged = crystallite_converged . and . crystallite_localConstitution ! ...restart all non-local as not converged
endif
endif
endsubroutine
!********************************************************************
! integrate stress, state and Temperature with
! 1nd order Euler method with adaptive step size
!********************************************************************
subroutine crystallite_integrateStateAdaptiveEuler ( mode , gg , ii , ee )
!*** variables and functions from other modules ***!
use prec , only : pInt , &
pReal
use debug , only : debugger , &
selectiveDebugger , &
verboseDebugger , &
debug_e , &
debug_i , &
debug_g , &
debug_StateLoopDistribution
use numerics , only : rTol_crystalliteState , &
rTol_crystalliteTemperature , &
subStepSizeCryst , &
stepIncreaseCryst
use FEsolving , only : FEsolving_execElem , &
FEsolving_execIP
use mesh , only : mesh_element , &
mesh_NcpElems , &
mesh_maxNips
use material , only : homogenization_Ngrains , &
homogenization_maxNgrains
use constitutive , only : constitutive_sizeDotState , &
constitutive_maxSizeDotState , &
constitutive_state , &
constitutive_relevantState , &
constitutive_subState0 , &
constitutive_dotState , &
constitutive_collectDotState , &
constitutive_dotTemperature , &
constitutive_microstructure
implicit none
!*** input variables ***!
integer ( pInt ) , intent ( in ) :: mode ! mode of calculation; 1: central solution, 2: stiffness (by perturbation)
integer ( pInt ) , optional , intent ( in ) :: ee , & ! element index
ii , & ! integration point index
gg ! grain index
!*** output variables ***!
!*** local variables ***!
integer ( pInt ) e , & ! element index in element loop
i , & ! integration point index in ip loop
g , & ! grain index in grain loop
j , &
n , & ! stage index in integration stage loop
sizeDotState , & ! size of dot State
s ! state index
integer ( pInt ) , dimension ( 2 ) :: eIter ! bounds for element iteration
integer ( pInt ) , dimension ( 2 , mesh_NcpElems ) :: iIter , & ! bounds for ip iteration
gIter ! bounds for grain iteration
real ( pReal ) , dimension ( constitutive_maxSizeDotState , homogenization_maxNgrains , mesh_maxNips , mesh_NcpElems ) :: &
stateResiduum , & ! residuum from evolution in micrstructure
relStateResiduum ! relative residuum from evolution in microstructure
real ( pReal ) , dimension ( homogenization_maxNgrains , mesh_maxNips , mesh_NcpElems ) :: &
temperatureResiduum , & ! residuum from evolution in temperature
relTemperatureResiduum ! relative residuum from evolution in temperature
logical singleRun ! flag indicating computation for single (g,i,e) triple
! --- LOOP ITERATOR FOR ELEMENT, GRAIN, IP ---
if ( present ( ee ) . and . present ( ii ) . and . present ( gg ) ) then
eIter = ee
iIter ( : , ee ) = ii
gIter ( : , ee ) = gg
singleRun = . true .
else
eIter = FEsolving_execElem ( 1 : 2 )
do e = eIter ( 1 ) , eIter ( 2 )
iIter ( : , e ) = FEsolving_execIP ( 1 : 2 , e )
gIter ( : , e ) = ( / 1 , homogenization_Ngrains ( mesh_element ( 3 , e ) ) / )
enddo
singleRun = . false .
endif
! --- UPDATE DEPENDENT STATES (EULER INTEGRATION) ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
call constitutive_microstructure ( crystallite_Temperature ( g , i , e ) , crystallite_Tstar_v ( : , g , i , e ) , crystallite_Fe , &
crystallite_Fp , crystallite_disorientation ( : , : , g , i , e ) , g , i , e ) ! update dependent state variables to be consistent with basic states
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- DOT STATE AND TEMPERATURE (EULER INTEGRATION) ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
selectiveDebugger = . false . !(e == debug_e .and. i == debug_i .and. g == debug_g)
call constitutive_collectDotState ( crystallite_Tstar_v ( : , g , i , e ) , crystallite_subTstar0_v ( : , g , i , e ) , &
crystallite_Fe , crystallite_Fp , crystallite_Temperature ( g , i , e ) , &
crystallite_disorientation ( : , : , g , i , e ) , crystallite_subdt ( g , i , e ) , g , i , e )
crystallite_dotTemperature ( g , i , e ) = constitutive_dotTemperature ( crystallite_Tstar_v ( : , g , i , e ) , &
crystallite_Temperature ( g , i , e ) , g , i , e )
if ( any ( constitutive_dotState ( g , i , e ) % p / = constitutive_dotState ( g , i , e ) % p ) & ! NaN occured in dotState
. or . crystallite_dotTemperature ( g , i , e ) / = crystallite_dotTemperature ( g , i , e ) ) then ! NaN occured in dotTemperature
if ( . not . crystallite_localConstitution ( g , i , e ) ) then ! if broken non-local...
!$OMP CRITICAL
crystallite_todo = crystallite_todo . and . crystallite_localConstitution ! ...all non-locals skipped
!$OMPEND CRITICAL
else ! if broken local...
crystallite_todo ( g , i , e ) = . false . ! ... skip this one next time
endif
else
stateResiduum ( : , g , i , e ) = - 0.5_pReal * constitutive_dotState ( g , i , e ) % p * crystallite_subdt ( g , i , e ) ! contribution to absolute residuum in state and temperature
temperatureResiduum ( g , i , e ) = - 0.5_pReal * crystallite_dotTemperature ( g , i , e ) * crystallite_subdt ( g , i , e )
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- STATE UPDATE (EULER INTEGRATION) ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
sizeDotState = constitutive_sizeDotState ( g , i , e )
constitutive_state ( g , i , e ) % p ( 1 : sizeDotState ) = constitutive_subState0 ( g , i , e ) % p ( 1 : sizeDotState ) &
+ constitutive_dotState ( g , i , e ) % p ( 1 : sizeDotState ) * crystallite_subdt ( g , i , e )
crystallite_Temperature ( g , i , e ) = crystallite_subTemperature0 ( g , i , e ) &
+ crystallite_dotTemperature ( g , i , e ) * crystallite_subdt ( g , i , e )
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- UPDATE DEPENDENT STATES (EULER INTEGRATION) ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
call constitutive_microstructure ( crystallite_Temperature ( g , i , e ) , crystallite_Tstar_v ( : , g , i , e ) , crystallite_Fe , &
crystallite_Fp , crystallite_disorientation ( : , : , g , i , e ) , g , i , e ) ! update dependent state variables to be consistent with basic states
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- STRESS INTEGRATION (EULER INTEGRATION) ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
selectiveDebugger = . false . !(e == debug_e .and. i == debug_i .and. g == debug_g .and. mode == 1)
if ( crystallite_todo ( g , i , e ) ) then
if ( . not . crystallite_integrateStress ( mode , g , i , e ) ) then
if ( . not . crystallite_localConstitution ( g , i , e ) ) then ! if broken non-local...
!$OMP CRITICAL
crystallite_todo = crystallite_todo . and . crystallite_localConstitution ! ...all non-locals skipped
!$OMPEND CRITICAL
else ! if broken local...
crystallite_todo ( g , i , e ) = . false . ! ... skip this one next time
endif
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- DOT STATE AND TEMPERATURE (HEUN METHOD) ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
selectiveDebugger = . false . !(e == debug_e .and. i == debug_i .and. g == debug_g)
if ( crystallite_todo ( g , i , e ) ) then
call constitutive_collectDotState ( crystallite_Tstar_v ( : , g , i , e ) , crystallite_subTstar0_v ( : , g , i , e ) , &
crystallite_Fe , crystallite_Fp , crystallite_Temperature ( g , i , e ) , &
crystallite_disorientation ( : , : , g , i , e ) , crystallite_subdt ( g , i , e ) , g , i , e )
crystallite_dotTemperature ( g , i , e ) = constitutive_dotTemperature ( crystallite_Tstar_v ( : , g , i , e ) , &
crystallite_Temperature ( g , i , e ) , g , i , e )
if ( any ( constitutive_dotState ( g , i , e ) % p / = constitutive_dotState ( g , i , e ) % p ) & ! NaN occured in dotState
. or . crystallite_dotTemperature ( g , i , e ) / = crystallite_dotTemperature ( g , i , e ) ) then ! NaN occured in dotTemperature
if ( . not . crystallite_localConstitution ( g , i , e ) ) then ! if broken non-local...
!$OMP CRITICAL
crystallite_todo = crystallite_todo . and . crystallite_localConstitution ! ...all non-locals skipped
!$OMPEND CRITICAL
else ! if broken local...
crystallite_todo ( g , i , e ) = . false . ! ... skip this one next time
endif
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- ERROR ESTIMATE FOR STATE AND TEMPERATURE (HEUN METHOD) ---
relStateResiduum = 0.0_pReal
relTemperatureResiduum = 0.0_pReal
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
selectiveDebugger = ( e == debug_e . and . i == debug_i . and . g == debug_g . and . mode == 1 )
sizeDotState = constitutive_sizeDotState ( g , i , e )
! --- contribution of heun step to absolute residui ---
stateResiduum ( : , g , i , e ) = stateResiduum ( : , g , i , e ) &
+ 0.5_pReal * constitutive_dotState ( g , i , e ) % p * crystallite_subdt ( g , i , e ) ! contribution to absolute residuum in state and temperature
temperatureResiduum ( g , i , e ) = temperatureResiduum ( g , i , e ) &
+ 0.5_pReal * crystallite_dotTemperature ( g , i , e ) * crystallite_subdt ( g , i , e )
! --- relative residui ---
forall ( s = 1 : sizeDotState , constitutive_state ( g , i , e ) % p ( s ) > constitutive_relevantState ( g , i , e ) % p ( s ) ) &
relStateResiduum ( s , g , i , e ) = abs ( stateResiduum ( s , g , i , e ) ) / constitutive_state ( g , i , e ) % p ( s ) / rTol_crystalliteState
if ( crystallite_Temperature ( g , i , e ) > 0 ) &
relTemperatureResiduum ( g , i , e ) = abs ( temperatureResiduum ( g , i , e ) ) / crystallite_Temperature ( g , i , e ) &
/ rTol_crystalliteTemperature
if ( verboseDebugger . and . selectiveDebugger ) then
!$OMP CRITICAL (write2out)
write ( 6 , * ) '::: updateState' , g , i , e
write ( 6 , * )
write ( 6 , '(a,/,12(f12.1,x))' ) 'updateState: absolute residuum' , stateResiduum ( 1 : sizeDotState , g , i , e )
write ( 6 , * )
write ( 6 , '(a,/,12(f12.1,x))' ) 'updateState: resid tolerance' , relStateResiduum ( 1 : sizeDotState , g , i , e )
write ( 6 , * )
write ( 6 , '(a,/,12(e14.8,x))' ) 'updateState: dotState' , constitutive_dotState ( g , i , e ) % p ( 1 : sizeDotState ) &
- 2.0_pReal * stateResiduum ( 1 : sizeDotState , g , i , e ) / crystallite_subdt ( g , i , e ) ! calculate former dotstate from higher order solution and state residuum
write ( 6 , * )
write ( 6 , '(a,/,12(e14.8,x))' ) 'updateState: new state' , constitutive_state ( g , i , e ) % p ( 1 : sizeDotState )
write ( 6 , * )
!$OMPEND CRITICAL (write2out)
endif
! --- converged ? ---
if ( all ( relStateResiduum ( 1 : sizeDotState , g , i , e ) < 1.0_pReal ) . and . relTemperatureResiduum ( g , i , e ) < 1.0_pReal ) then
crystallite_converged ( g , i , e ) = . true . ! ... converged per definitionem
crystallite_todo ( g , i , e ) = . false . ! ... integration done
!$OMP CRITICAL (distributionState)
debug_StateLoopDistribution ( 6 , mode ) = debug_StateLoopDistribution ( 6 , mode ) + 1
!$OMPEND CRITICAL (distributionState)
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- NONLOCAL CONVERGENCE CHECK ---
if ( verboseDebugger . and . mode == 1 ) write ( 6 , * ) 'crystallite_converged' , crystallite_converged
if ( . not . ( mode == 2 . and . singleRun ) ) then ! except for local stiffness calculation:
if ( any ( . not . crystallite_converged . and . . not . crystallite_localConstitution ) ) then ! any non-local not yet converged (or broken)...
crystallite_converged = crystallite_converged . and . crystallite_localConstitution ! ...restart all non-local as not converged
endif
endif
endsubroutine
!********************************************************************
! integrate stress, state and Temperature with
! 1st order explicit Euler method
!********************************************************************
subroutine crystallite_integrateStateEuler ( mode , gg , ii , ee )
!*** variables and functions from other modules ***!
use prec , only : pInt , &
pReal
use debug , only : debugger , &
selectiveDebugger , &
verboseDebugger , &
debug_e , &
debug_i , &
debug_g , &
debug_StateLoopDistribution
use FEsolving , only : FEsolving_execElem , &
FEsolving_execIP
use mesh , only : mesh_element , &
mesh_NcpElems
use material , only : homogenization_Ngrains
use constitutive , only : constitutive_sizeDotState , &
constitutive_state , &
constitutive_subState0 , &
constitutive_dotState , &
constitutive_collectDotState , &
constitutive_dotTemperature , &
constitutive_microstructure
implicit none
!*** input variables ***!
integer ( pInt ) , intent ( in ) :: mode ! mode of calculation; 1: central solution, 2: stiffness (by perturbation)
integer ( pInt ) , optional , intent ( in ) :: ee , & ! element index
ii , & ! integration point index
gg ! grain index
!*** output variables ***!
!*** local variables ***!
integer ( pInt ) e , & ! element index in element loop
i , & ! integration point index in ip loop
g , & ! grain index in grain loop
n , &
mySizeDotState
integer ( pInt ) , dimension ( 2 ) :: eIter ! bounds for element iteration
integer ( pInt ) , dimension ( 2 , mesh_NcpElems ) :: iIter , & ! bounds for ip iteration
gIter ! bounds for grain iteration
logical singleRun ! flag indicating computation for single (g,i,e) triple
if ( present ( ee ) . and . present ( ii ) . and . present ( gg ) ) then
eIter = ee
iIter ( : , ee ) = ii
gIter ( : , ee ) = gg
singleRun = . true .
else
eIter = FEsolving_execElem ( 1 : 2 )
do e = eIter ( 1 ) , eIter ( 2 )
iIter ( : , e ) = FEsolving_execIP ( 1 : 2 , e )
gIter ( : , e ) = ( / 1 , homogenization_Ngrains ( mesh_element ( 3 , e ) ) / )
enddo
singleRun = . false .
endif
! --- UPDATE DEPENDENT STATES ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
call constitutive_microstructure ( crystallite_Temperature ( g , i , e ) , crystallite_Tstar_v ( : , g , i , e ) , crystallite_Fe , &
crystallite_Fp , crystallite_disorientation ( : , : , g , i , e ) , g , i , e ) ! update dependent state variables to be consistent with basic states
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- DOT STATE AND TEMPERATURE ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
selectiveDebugger = . false . !(e == debug_e .and. i == debug_i .and. g == debug_g .and. mode == 1)
call constitutive_collectDotState ( crystallite_Tstar_v ( : , g , i , e ) , crystallite_subTstar0_v ( : , g , i , e ) , &
crystallite_Fe , crystallite_Fp , crystallite_Temperature ( g , i , e ) , &
crystallite_disorientation ( : , : , g , i , e ) , crystallite_subdt ( g , i , e ) , g , i , e )
crystallite_dotTemperature ( g , i , e ) = constitutive_dotTemperature ( crystallite_Tstar_v ( : , g , i , e ) , &
crystallite_Temperature ( g , i , e ) , g , i , e )
if ( any ( constitutive_dotState ( g , i , e ) % p / = constitutive_dotState ( g , i , e ) % p ) & ! NaN occured in dotState
. or . crystallite_dotTemperature ( g , i , e ) / = crystallite_dotTemperature ( g , i , e ) ) then ! NaN occured in dotTemperature
if ( . not . crystallite_localConstitution ( g , i , e ) ) then ! if broken non-local...
!$OMP CRITICAL
crystallite_todo = crystallite_todo . and . crystallite_localConstitution ! ...all non-locals skipped
!$OMPEND CRITICAL
else ! if broken local...
crystallite_todo ( g , i , e ) = . false . ! ... skip this one next time
endif
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- UPDATE STATE AND TEMPERATURE ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
selectiveDebugger = ( e == debug_e . and . i == debug_i . and . g == debug_g . and . mode == 1 )
mySizeDotState = constitutive_sizeDotState ( g , i , e )
constitutive_state ( g , i , e ) % p ( 1 : mySizeDotState ) = constitutive_subState0 ( g , i , e ) % p ( 1 : mySizeDotState ) &
+ constitutive_dotState ( g , i , e ) % p ( 1 : mySizeDotState ) * crystallite_subdt ( g , i , e )
crystallite_Temperature ( g , i , e ) = crystallite_subTemperature0 ( g , i , e ) &
+ crystallite_dotTemperature ( g , i , e ) * crystallite_subdt ( g , i , e )
if ( verboseDebugger . and . selectiveDebugger ) then
!$OMP CRITICAL (write2out)
write ( 6 , * ) '::: updateState' , g , i , e
write ( 6 , * )
write ( 6 , '(a,/,12(e14.8,x))' ) 'updateState: dotState' , constitutive_dotState ( g , i , e ) % p ( 1 : mySizeDotState )
write ( 6 , * )
write ( 6 , '(a,/,12(e14.8,x))' ) 'updateState: new state' , constitutive_state ( g , i , e ) % p ( 1 : mySizeDotState )
write ( 6 , * )
!$OMPEND CRITICAL (write2out)
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- UPDATE DEPENDENT STATES ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
call constitutive_microstructure ( crystallite_Temperature ( g , i , e ) , crystallite_Tstar_v ( : , g , i , e ) , crystallite_Fe , &
crystallite_Fp , crystallite_disorientation ( : , : , g , i , e ) , g , i , e ) ! update dependent state variables to be consistent with basic states
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- STRESS INTEGRATION ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
selectiveDebugger = . false . !(e == debug_e .and. i == debug_i .and. g == debug_g .and. mode == 1)
if ( crystallite_todo ( g , i , e ) ) then
if ( crystallite_integrateStress ( mode , g , i , e ) ) then
crystallite_converged ( g , i , e ) = . true .
!$OMP CRITICAL (distributionState)
debug_StateLoopDistribution ( 1 , mode ) = debug_StateLoopDistribution ( 1 , mode ) + 1
!$OMPEND CRITICAL (distributionState)
else ! broken stress integration
if ( . not . crystallite_localConstitution ( g , i , e ) ) then ! if broken non-local...
!$OMP CRITICAL
crystallite_todo = crystallite_todo . and . crystallite_localConstitution ! ...all non-locals skipped
!$OMPEND CRITICAL
endif
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- CHECK NON-LOCAL CONVERGENCE ---
crystallite_todo = . false . ! done with integration
if ( . not . ( mode == 2 . and . singleRun ) & ! except for local stiffness calculation:
. and . any ( . not . crystallite_converged . and . . not . crystallite_localConstitution ) ) then ! any non-local not yet converged (or broken)...
crystallite_converged = crystallite_converged . and . crystallite_localConstitution ! ...restart all non-local as not converged
endif
endsubroutine
!********************************************************************
! integrate stress, state and Temperature with
! adaptive 1st order explicit Euler method
! using Fixed Point Iteration to adapt the stepsize
!********************************************************************
subroutine crystallite_integrateStateFPI ( mode , gg , ii , ee )
!*** variables and functions from other modules ***!
use prec , only : pInt , &
pReal
use debug , only : debugger , &
selectiveDebugger , &
verboseDebugger , &
debug_e , &
debug_i , &
debug_g , &
debug_StateLoopDistribution
use numerics , only : nState
use FEsolving , only : FEsolving_execElem , &
FEsolving_execIP
use mesh , only : mesh_element , &
mesh_NcpElems
use material , only : homogenization_Ngrains
use constitutive , only : constitutive_sizeDotState , &
constitutive_state , &
constitutive_dotState , &
constitutive_collectDotState , &
constitutive_dotTemperature , &
constitutive_microstructure , &
constitutive_previousDotState , &
constitutive_previousDotState2
implicit none
!*** input variables ***!
integer ( pInt ) , intent ( in ) :: mode ! mode of calculation; 1: central solution, 2: stiffness (by perturbation)
integer ( pInt ) , optional , intent ( in ) :: ee , & ! element index
ii , & ! integration point index
gg ! grain index
!*** output variables ***!
!*** local variables ***!
integer ( pInt ) NiterationState , & ! number of iterations in state loop
e , & ! element index in element loop
i , & ! integration point index in ip loop
g ! grain index in grain loop
integer ( pInt ) , dimension ( 2 ) :: eIter ! bounds for element iteration
integer ( pInt ) , dimension ( 2 , mesh_NcpElems ) :: iIter , & ! bounds for ip iteration
gIter ! bounds for grain iteration
real ( pReal ) dot_prod12 , &
dot_prod22
logical singleRun ! flag indicating computation for single (g,i,e) triple
if ( present ( ee ) . and . present ( ii ) . and . present ( gg ) ) then
eIter = ee
iIter ( : , ee ) = ii
gIter ( : , ee ) = gg
singleRun = . true .
else
eIter = FEsolving_execElem ( 1 : 2 )
do e = eIter ( 1 ) , eIter ( 2 )
iIter ( : , e ) = FEsolving_execIP ( 1 : 2 , e )
gIter ( : , e ) = ( / 1 , homogenization_Ngrains ( mesh_element ( 3 , e ) ) / )
enddo
singleRun = . false .
endif
! --+>> PREGUESS FOR STATE <<+--
! --- UPDATE DEPENDENT STATES ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
call constitutive_microstructure ( crystallite_Temperature ( g , i , e ) , crystallite_Tstar_v ( : , g , i , e ) , crystallite_Fe , &
crystallite_Fp , crystallite_disorientation ( : , : , g , i , e ) , g , i , e ) ! update dependent state variables to be consistent with basic states
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- DOT STATES ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
selectiveDebugger = . false . !(e == debug_e .and. i == debug_i .and. g == debug_g .and. mode == 1)
if ( crystallite_todo ( g , i , e ) ) then
constitutive_previousDotState2 ( g , i , e ) % p = 0.0_pReal
constitutive_previousDotState ( g , i , e ) % p = 0.0_pReal
call constitutive_collectDotState ( crystallite_Tstar_v ( : , g , i , e ) , crystallite_subTstar0_v ( : , g , i , e ) , &
crystallite_Fe , crystallite_Fp , crystallite_Temperature ( g , i , e ) , &
crystallite_disorientation ( : , : , g , i , e ) , crystallite_subdt ( g , i , e ) , g , i , e )
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- STATE & TEMPERATURE UPDATE ---
crystallite_statedamper = 1.0_pReal
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
selectiveDebugger = ( e == debug_e . and . i == debug_i . and . g == debug_g . and . mode == 1 )
if ( crystallite_todo ( g , i , e ) ) then
crystallite_stateConverged ( g , i , e ) = crystallite_updateState ( g , i , e ) ! update state
crystallite_temperatureConverged ( g , i , e ) = crystallite_updateTemperature ( g , i , e ) ! update temperature
if ( . not . crystallite_localConstitution ( g , i , e ) . and . . not . crystallite_todo ( g , i , e ) ) then ! if updateState or updateTemperature signals broken non-local...
!$OMP CRITICAL
crystallite_todo = crystallite_todo . and . crystallite_localConstitution ! ...all non-locals skipped
!$OMPEND CRITICAL
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --+>> STATE LOOP <<+--
NiterationState = 0_pInt
do while ( any ( crystallite_todo ) . and . NiterationState < nState ) ! convergence loop for crystallite
NiterationState = NiterationState + 1_pInt
! --- STRESS INTEGRATION ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
selectiveDebugger = . false . !(e == debug_e .and. i == debug_i .and. g == debug_g .and. mode == 1)
if ( crystallite_todo ( g , i , e ) ) then
crystallite_todo ( g , i , e ) = crystallite_integrateStress ( mode , g , i , e )
if ( . not . crystallite_localConstitution ( g , i , e ) . and . . not . crystallite_todo ( g , i , e ) ) then ! if broken non-local...
!$OMP CRITICAL
crystallite_todo = crystallite_todo . and . crystallite_localConstitution ! ...all non-locals skipped
!$OMPEND CRITICAL
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
if ( verboseDebugger . and . mode == 1 ) then
!$OMP CRITICAL (write2out)
write ( 6 , * ) count ( crystallite_todo ( : , : , : ) ) , 'grains todo after stress integration'
!$OMPEND CRITICAL (write2out)
endif
! --- DOT STATES ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
selectiveDebugger = . false . !(e == debug_e .and. i == debug_i .and. g == debug_g .and. mode == 1)
if ( crystallite_todo ( g , i , e ) ) then
constitutive_previousDotState2 ( g , i , e ) % p = constitutive_previousDotState ( g , i , e ) % p ! wind forward dotStates
constitutive_previousDotState ( g , i , e ) % p = constitutive_dotState ( g , i , e ) % p
call constitutive_collectDotState ( crystallite_Tstar_v ( : , g , i , e ) , crystallite_subTstar0_v ( : , g , i , e ) , &
crystallite_Fe , crystallite_Fp , crystallite_Temperature ( g , i , e ) , &
crystallite_disorientation ( : , : , g , i , e ) , crystallite_subdt ( g , i , e ) , g , i , e )
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- STATE & TEMPERATURE UPDATE ---
crystallite_statedamper = 1.0_pReal
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
selectiveDebugger = ( e == debug_e . and . i == debug_i . and . g == debug_g . and . mode == 1 )
if ( crystallite_todo ( g , i , e ) ) then
! --- state damper ---
dot_prod12 = dot_product ( constitutive_dotState ( g , i , e ) % p - constitutive_previousDotState ( g , i , e ) % p , &
constitutive_previousDotState ( g , i , e ) % p - constitutive_previousDotState2 ( g , i , e ) % p )
dot_prod22 = dot_product ( constitutive_previousDotState ( g , i , e ) % p - constitutive_previousDotState2 ( g , i , e ) % p , &
constitutive_previousDotState ( g , i , e ) % p - constitutive_previousDotState2 ( g , i , e ) % p )
if ( dot_prod22 > 0.0_pReal &
. and . ( dot_prod12 < 0.0_pReal &
. or . dot_product ( constitutive_dotState ( g , i , e ) % p , constitutive_previousDotState ( g , i , e ) % p ) < 0.0_pReal ) ) &
crystallite_statedamper ( g , i , e ) = 0.75_pReal + 0.25_pReal * tanh ( 2.0_pReal + 4.0_pReal * dot_prod12 / dot_prod22 )
! --- updates ---
crystallite_stateConverged ( g , i , e ) = crystallite_updateState ( g , i , e ) ! update state
crystallite_temperatureConverged ( g , i , e ) = crystallite_updateTemperature ( g , i , e ) ! update temperature
crystallite_converged ( g , i , e ) = crystallite_stateConverged ( g , i , e ) . and . crystallite_temperatureConverged ( g , i , e )
if ( . not . crystallite_localConstitution ( g , i , e ) . and . . not . crystallite_todo ( g , i , e ) ) then ! if updateState or updateTemperature signals broken non-local...
!$OMP CRITICAL
crystallite_todo = crystallite_todo . and . crystallite_localConstitution ! ...all non-locals skipped
!$OMPEND CRITICAL
elseif ( crystallite_converged ( g , i , e ) ) then
!$OMP CRITICAL (distributionState)
debug_StateLoopDistribution ( NiterationState , mode ) = debug_StateLoopDistribution ( NiterationState , mode ) + 1
!$OMPEND CRITICAL (distributionState)
endif
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
! --- UPDATE DEPENDENT STATES ---
!$OMP PARALLEL DO
do e = eIter ( 1 ) , eIter ( 2 ) ; do i = iIter ( 1 , e ) , iIter ( 2 , e ) ; do g = gIter ( 1 , e ) , gIter ( 2 , e ) ! iterate over elements, ips and grains
if ( crystallite_todo ( g , i , e ) ) then
call constitutive_microstructure ( crystallite_Temperature ( g , i , e ) , crystallite_Tstar_v ( : , g , i , e ) , crystallite_Fe , &
crystallite_Fp , crystallite_disorientation ( : , : , g , i , e ) , g , i , e ) ! update dependent state variables to be consistent with basic states
endif
enddo ; enddo ; enddo
!$OMPEND PARALLEL DO
if ( verboseDebugger . and . mode == 1 ) then
!$OMP CRITICAL (write2out)
write ( 6 , * ) count ( crystallite_converged ( : , : , : ) ) , 'grains converged after state integration no.' , NiterationState
write ( 6 , * )
!$OMPEND CRITICAL (write2out)
endif
! --- CONVERGENCE CHECK ---
if ( . not . ( mode == 2 . and . singleRun ) & ! except for local stiffness calculation:
. and . any ( . not . crystallite_converged . and . . not . crystallite_localConstitution ) ) then ! any non-local not yet converged (or broken)...
crystallite_converged = crystallite_converged . and . crystallite_localConstitution ! ...restart all non-local as not converged
endif
crystallite_todo = crystallite_todo . and . . not . crystallite_converged ! skip all converged
if ( verboseDebugger . and . mode == 1 ) then
!$OMP CRITICAL (write2out)
write ( 6 , * ) count ( crystallite_converged ( : , : , : ) ) , 'grains converged after non-local check'
write ( 6 , * ) count ( crystallite_todo ( : , : , : ) ) , 'grains todo after state integration no.' , NiterationState
write ( 6 , * )
!$OMPEND CRITICAL (write2out)
endif
enddo ! crystallite convergence loop
endsubroutine
!********************************************************************
! update the internal state of the constitutive law
! and tell whether state has converged
!********************************************************************
function crystallite_updateState ( g , i , e )
!*** variables and functions from other modules ***!
use prec , only : pReal , &
pInt , &
pLongInt
use numerics , only : rTol_crystalliteState
use constitutive , only : constitutive_dotState , &
constitutive_previousDotState , &
constitutive_sizeDotState , &
constitutive_subState0 , &
constitutive_state , &
constitutive_relevantState , &
constitutive_microstructure
use debug , only : debugger , &
selectiveDebugger , &
verboseDebugger
!*** input variables ***!
integer ( pInt ) , intent ( in ) :: e , & ! element index
i , & ! integration point index
g ! grain index
!*** output variables ***!
logical crystallite_updateState ! flag indicating if integration suceeded
!*** local variables ***!
real ( pReal ) , dimension ( constitutive_sizeDotState ( g , i , e ) ) :: residuum ! residuum from evolution of microstructure
integer ( pInt ) mySize
mySize = constitutive_sizeDotState ( g , i , e )
! correct my dotState
constitutive_dotState ( g , i , e ) % p ( 1 : mySize ) = constitutive_dotState ( g , i , e ) % p ( 1 : mySize ) * crystallite_statedamper ( g , i , e ) &
+ constitutive_previousDotState ( g , i , e ) % p ( 1 : mySize ) * ( 1.0_pReal - crystallite_statedamper ( g , i , e ) )
residuum = constitutive_state ( g , i , e ) % p ( 1 : mySize ) - constitutive_subState0 ( g , i , e ) % p ( 1 : mySize ) &
- constitutive_dotState ( g , i , e ) % p ( 1 : mySize ) * crystallite_subdt ( g , i , e )
if ( any ( residuum / = residuum ) ) then ! if NaN occured then return without changing the state...
crystallite_updateState = . false . ! ...indicate state update failed
crystallite_todo ( g , i , e ) = . false . ! ...no need to calculate any further
if ( verboseDebugger ) then
!$OMP CRITICAL (write2out)
write ( 6 , * ) '::: updateState encountered NaN' , g , i , e
!$OMPEND CRITICAL (write2out)
endif
return
endif
constitutive_state ( g , i , e ) % p ( 1 : mySize ) = constitutive_state ( g , i , e ) % p ( 1 : mySize ) - residuum
! setting flag to true if state is below relative tolerance, otherwise set it to false
crystallite_updateState = all ( constitutive_state ( g , i , e ) % p ( 1 : mySize ) < constitutive_relevantState ( g , i , e ) % p ( 1 : mySize ) &
. or . abs ( residuum ) < rTol_crystalliteState * abs ( constitutive_state ( g , i , e ) % p ( 1 : mySize ) ) )
if ( verboseDebugger . and . selectiveDebugger ) then
!$OMP CRITICAL (write2out)
if ( crystallite_updateState ) then
write ( 6 , * ) '::: updateState converged' , g , i , e
else
write ( 6 , * ) '::: updateState did not converge' , g , i , e
endif
write ( 6 , * )
write ( 6 , '(a,f6.1)' ) 'updateState: crystallite_statedamper' , crystallite_statedamper ( g , i , e )
write ( 6 , * )
write ( 6 , '(a,/,12(e14.8,x))' ) 'updateState: dotState' , constitutive_dotState ( g , i , e ) % p ( 1 : mySize )
write ( 6 , * )
write ( 6 , '(a,/,12(e14.8,x))' ) 'updateState: new state' , constitutive_state ( g , i , e ) % p ( 1 : mySize )
write ( 6 , * )
write ( 6 , '(a,/,12(f12.1,x))' ) 'updateState: resid tolerance' , abs ( residuum / rTol_crystalliteState &
/ constitutive_state ( g , i , e ) % p ( 1 : mySize ) )
write ( 6 , * )
!$OMPEND CRITICAL (write2out)
endif
endfunction
!********************************************************************
! update the temperature of the grain
! and tell whether it has converged
!********************************************************************
function crystallite_updateTemperature ( &
g , & ! grain number
i , & ! integration point number
e & ! element number
)
!*** variables and functions from other modules ***!
use prec , only : pReal , &
pInt , &
pLongInt
use numerics , only : rTol_crystalliteTemperature
use constitutive , only : constitutive_dotTemperature
use debug , only : debugger
!*** input variables ***!
integer ( pInt ) , intent ( in ) :: e , & ! element index
i , & ! integration point index
g ! grain index
!*** output variables ***!
logical crystallite_updateTemperature ! flag indicating if integration suceeded
!*** local variables ***!
real ( pReal ) residuum ! residuum from evolution of temperature
! calculate the residuum
residuum = crystallite_Temperature ( g , i , e ) - crystallite_subTemperature0 ( g , i , e ) - &
crystallite_subdt ( g , i , e ) * &
2009-08-11 22:01:57 +05:30
constitutive_dotTemperature ( crystallite_Tstar_v ( : , g , i , e ) , crystallite_Temperature ( g , i , e ) , g , i , e )
2009-07-22 21:37:19 +05:30
! if NaN occured then return without changing the state
if ( residuum / = residuum ) then
crystallite_updateTemperature = . false . ! indicate update failed
2010-10-01 17:48:49 +05:30
crystallite_todo ( g , i , e ) = . false . ! ...no need to calculate any further
2009-07-22 21:37:19 +05:30
!$OMP CRITICAL (write2out)
2009-08-24 13:46:01 +05:30
write ( 6 , * ) '::: updateTemperature encountered NaN' , g , i , e
2009-07-22 21:37:19 +05:30
!$OMPEND CRITICAL (write2out)
return
endif
! update the microstructure
crystallite_Temperature ( g , i , e ) = crystallite_Temperature ( g , i , e ) - residuum
2009-08-24 13:46:01 +05:30
! setting flag to true if residuum is below relative tolerance (or zero Kelvin), otherwise set it to false
2009-07-31 17:32:20 +05:30
crystallite_updateTemperature = crystallite_Temperature ( g , i , e ) == 0.0_pReal . or . &
abs ( residuum ) < rTol_crystalliteTemperature * crystallite_Temperature ( g , i , e )
2009-07-22 21:37:19 +05:30
return
endfunction
2009-05-07 21:57:36 +05:30
!***********************************************************************
2009-05-28 22:08:40 +05:30
!*** calculation of stress (P) with time integration ***
!*** based on a residuum in Lp and intermediate ***
2009-05-07 21:57:36 +05:30
!*** acceleration of the Newton-Raphson correction ***
!***********************************************************************
function crystallite_integrateStress ( &
2010-09-06 21:36:41 +05:30
mode , & ! 1: central solution, 2: stiffness (by perturbation)
2009-05-07 21:57:36 +05:30
g , & ! grain number
i , & ! integration point number
2010-10-01 17:48:49 +05:30
e , & ! element number
fraction &
)
2010-09-06 21:36:41 +05:30
2009-05-07 21:57:36 +05:30
2009-06-02 15:07:38 +05:30
!*** variables and functions from other modules ***!
use prec , only : pReal , &
pInt , &
2009-06-15 18:41:21 +05:30
pLongInt
use numerics , only : nStress , &
2009-06-02 15:07:38 +05:30
aTol_crystalliteStress , &
rTol_crystalliteStress , &
2009-06-15 18:41:21 +05:30
iJacoLpresiduum , &
relevantStrain
2009-06-02 15:07:38 +05:30
use debug , only : debugger , &
2010-02-17 18:51:36 +05:30
selectiveDebugger , &
2010-03-19 19:44:08 +05:30
verboseDebugger , &
2009-06-02 15:07:38 +05:30
debug_cumLpCalls , &
debug_cumLpTicks , &
2010-09-30 13:01:53 +05:30
debug_StressLoopDistribution , &
debug_LeapfrogBreakDistribution
2009-08-28 19:20:47 +05:30
use constitutive , only : constitutive_homogenizedC , &
2009-06-02 15:07:38 +05:30
constitutive_LpAndItsTangent
use math , only : math_mul33x33 , &
math_mul66x6 , &
math_mul99x99 , &
math_inv3x3 , &
math_invert3x3 , &
2009-06-02 15:25:45 +05:30
math_invert , &
math_det3x3 , &
2009-06-09 16:35:29 +05:30
math_I3 , &
2009-06-02 15:07:38 +05:30
math_identity2nd , &
math_Mandel66to3333 , &
2009-06-02 15:25:45 +05:30
math_Mandel6to33 , &
2009-06-02 15:07:38 +05:30
math_mandel33to6
2009-05-07 21:57:36 +05:30
implicit none
2009-05-28 22:08:40 +05:30
!*** input variables ***!
2010-09-06 21:36:41 +05:30
integer ( pInt ) , intent ( in ) :: mode , & ! 1 or 2
e , & ! element index
2009-06-02 15:07:38 +05:30
i , & ! integration point index
g ! grain index
2010-10-01 17:48:49 +05:30
real ( pReal ) , optional , intent ( in ) :: fraction ! fraction of timestep
2009-05-28 22:08:40 +05:30
!*** output variables ***!
2009-06-02 15:07:38 +05:30
logical crystallite_integrateStress ! flag indicating if integration suceeded
2009-06-09 16:35:29 +05:30
!*** local variables ***!
real ( pReal ) , dimension ( 3 , 3 ) :: Fg_new , & ! deformation gradient at end of timestep
2009-06-02 15:07:38 +05:30
Fp_current , & ! plastic deformation gradient at start of timestep
Fp_new , & ! plastic deformation gradient at end of timestep
Fe_new , & ! elastic deformation gradient at end of timestep
invFp_new , & ! inverse of Fp_new
invFp_current , & ! inverse of Fp_current
Lpguess , & ! current guess for plastic velocity gradient
Lpguess_old , & ! known last good guess for plastic velocity gradient
Lp_constitutive , & ! plastic velocity gradient resulting from constitutive law
residuum , & ! current residuum of plastic velocity gradient
residuum_old , & ! last residuum of plastic velocity gradient
A , &
B , &
BT , &
AB , &
BTA
real ( pReal ) , dimension ( 6 ) :: Tstar_v ! 2nd Piola-Kirchhoff Stress in Mandel-Notation
2009-10-07 21:01:52 +05:30
real ( pReal ) , dimension ( 9 , 9 ) :: dLpdT_constitutive , & ! partial derivative of plastic velocity gradient calculated by constitutive law
2009-06-02 15:07:38 +05:30
dTdLp , & ! partial derivative of 2nd Piola-Kirchhoff stress
dRdLp , & ! partial derivative of residuum (Jacobian for NEwton-Raphson scheme)
invdRdLp ! inverse of dRdLp
real ( pReal ) , dimension ( 3 , 3 , 3 , 3 ) :: C ! 4th rank elasticity tensor
real ( pReal ) , dimension ( 6 , 6 ) :: C_66 ! simplified 2nd rank elasticity tensor
real ( pReal ) p_hydro , & ! volumetric part of 2nd Piola-Kirchhoff Stress
det , & ! determinant
leapfrog , & ! acceleration factor for Newton-Raphson scheme
2010-10-01 17:48:49 +05:30
maxleap , & ! maximum acceleration factor
dt ! time increment
2009-06-02 15:07:38 +05:30
logical error ! flag indicating an error
integer ( pInt ) NiterationStress , & ! number of stress integrations
dummy , &
h , &
j , &
k , &
l , &
m , &
2009-06-09 16:35:29 +05:30
n , &
jacoCounter ! counter to check for Jacobian update
2009-06-02 15:07:38 +05:30
integer ( pLongInt ) tick , &
tock , &
tickrate , &
maxticks
2009-05-28 22:08:40 +05:30
! be pessimistic
crystallite_integrateStress = . false .
2010-10-01 17:48:49 +05:30
! only integrate over fraction of timestep?
if ( present ( fraction ) ) then
dt = crystallite_subdt ( g , i , e ) * fraction
Fg_new = crystallite_subF0 ( : , : , g , i , e ) + ( crystallite_subF ( : , : , g , i , e ) - crystallite_subF0 ( : , : , g , i , e ) ) * fraction
else
dt = crystallite_subdt ( g , i , e )
Fg_new = crystallite_subF ( : , : , g , i , e )
endif
2009-05-28 22:08:40 +05:30
! feed local variables
Fp_current = crystallite_subFp0 ( : , : , g , i , e )
Tstar_v = crystallite_Tstar_v ( : , g , i , e )
Lpguess_old = crystallite_Lp ( : , : , g , i , e ) ! consider present Lp good (i.e. worth remembering) ...
Lpguess = crystallite_Lp ( : , : , g , i , e ) ! ... and take it as first guess
2009-08-28 19:20:47 +05:30
2009-05-28 22:08:40 +05:30
! inversion of Fp_current...
invFp_current = math_inv3x3 ( Fp_current )
if ( all ( invFp_current == 0.0_pReal ) ) then ! ... failed?
2010-04-28 22:49:58 +05:30
if ( verboseDebugger . and . selectiveDebugger ) then
2009-08-24 13:46:01 +05:30
!$OMP CRITICAL (write2out)
write ( 6 , * ) '::: integrateStress failed on invFp_current inversion' , g , i , e
write ( 6 , * )
2010-04-28 22:49:58 +05:30
write ( 6 , '(a11,i3,x,i2,x,i5,/,3(3(f12.7,x)/))' ) 'invFp_new at ' , g , i , e , invFp_new
2009-08-24 13:46:01 +05:30
!$OMPEND CRITICAL (write2out)
endif
2009-05-28 22:08:40 +05:30
return
endif
A = math_mul33x33 ( transpose ( invFp_current ) , math_mul33x33 ( transpose ( Fg_new ) , math_mul33x33 ( Fg_new , invFp_current ) ) )
! get elasticity tensor
C_66 = constitutive_homogenizedC ( g , i , e )
2009-07-22 21:37:19 +05:30
! if (debugger) write(6,'(a,/,6(6(f10.4,x)/))') 'elasticity',C_66(1:6,:)/1e9
2009-05-28 22:08:40 +05:30
C = math_Mandel66to3333 ( C_66 )
! start LpLoop with no acceleration
NiterationStress = 0_pInt
leapfrog = 1.0_pReal
maxleap = 102 4.0_pReal
2009-06-09 16:35:29 +05:30
jacoCounter = 0_pInt
2009-05-07 21:57:36 +05:30
2009-05-28 22:08:40 +05:30
LpLoop : do
! increase loop counter
NiterationStress = NiterationStress + 1
! too many loops required ?
2009-10-07 21:01:52 +05:30
if ( NiterationStress > nStress ) then
2010-03-19 19:44:08 +05:30
if ( verboseDebugger ) then
2009-10-07 21:01:52 +05:30
!$OMP CRITICAL (write2out)
2009-12-15 13:50:31 +05:30
write ( 6 , * ) '::: integrateStress reached loop limit at ' , g , i , e
2009-10-07 21:01:52 +05:30
write ( 6 , * )
!$OMPEND CRITICAL (write2out)
endif
return
endif
2009-05-28 22:08:40 +05:30
2010-10-01 17:48:49 +05:30
B = math_I3 - dt * Lpguess
2009-05-07 21:57:36 +05:30
BT = transpose ( B )
AB = math_mul33x33 ( A , B )
BTA = math_mul33x33 ( BT , A )
2009-05-28 22:08:40 +05:30
! calculate 2nd Piola-Kirchhoff stress tensor
2009-05-07 21:57:36 +05:30
Tstar_v = 0.5_pReal * math_mul66x6 ( C_66 , math_mandel33to6 ( math_mul33x33 ( BT , AB ) - math_I3 ) )
2009-05-28 22:08:40 +05:30
p_hydro = sum ( Tstar_v ( 1 : 3 ) ) / 3.0_pReal
forall ( n = 1 : 3 ) Tstar_v ( n ) = Tstar_v ( n ) - p_hydro ! get deviatoric stress tensor
! calculate plastic velocity gradient and its tangent according to constitutive law
2009-05-07 21:57:36 +05:30
call system_clock ( count = tick , count_rate = tickrate , count_max = maxticks )
2009-10-07 21:01:52 +05:30
call constitutive_LpAndItsTangent ( Lp_constitutive , dLpdT_constitutive , Tstar_v , crystallite_Temperature ( g , i , e ) , g , i , e )
2009-05-07 21:57:36 +05:30
call system_clock ( count = tock , count_rate = tickrate , count_max = maxticks )
debug_cumLpCalls = debug_cumLpCalls + 1_pInt
debug_cumLpTicks = debug_cumLpTicks + tock - tick
if ( tock < tick ) debug_cumLpTicks = debug_cumLpTicks + maxticks
2010-03-19 19:44:08 +05:30
if ( verboseDebugger . and . selectiveDebugger ) then
2009-10-07 21:01:52 +05:30
!$OMP CRITICAL (write2out)
2010-04-28 22:49:58 +05:30
write ( 6 , '(a,i3,x,i2,x,i5,x,a,x,i3)' ) '::: integrateStress at ' , g , i , e , ' ; iteration ' , NiterationStress
2009-10-07 21:01:52 +05:30
write ( 6 , * )
2010-04-28 22:49:58 +05:30
write ( 6 , '(a,/,3(3(e20.7,x)/))' ) 'Lp_constitutive' , Lp_constitutive
write ( 6 , '(a,/,3(3(e20.7,x)/))' ) 'Lpguess' , Lpguess
2009-10-07 21:01:52 +05:30
!$OMPEND CRITICAL (write2out)
endif
2009-05-07 21:57:36 +05:30
2009-05-28 22:08:40 +05:30
! update current residuum
residuum = Lpguess - Lp_constitutive
2009-05-07 21:57:36 +05:30
2009-05-28 22:08:40 +05:30
! Check for convergence of loop
if ( . not . ( any ( residuum / = residuum ) ) . and . & ! exclude any NaN in residuum
( maxval ( abs ( residuum ) ) < aTol_crystalliteStress . or . & ! below absolute tolerance .or.
2010-10-01 17:48:49 +05:30
( any ( abs ( dt * Lpguess ) > relevantStrain ) . and . & ! worth checking? .and.
maxval ( abs ( residuum / Lpguess ) , abs ( dt * Lpguess ) > relevantStrain ) < rTol_crystalliteStress & ! below relative tolerance
2009-05-07 21:57:36 +05:30
) &
2009-05-28 22:08:40 +05:30
) &
) &
exit LpLoop
! NaN occured at regular speed?
if ( any ( residuum / = residuum ) . and . leapfrog == 1.0 ) then
2010-09-30 13:01:53 +05:30
if ( debugger ) then
2009-08-24 13:46:01 +05:30
!$OMP CRITICAL (write2out)
2010-09-30 13:01:53 +05:30
write ( 6 , '(a,i3,x,i2,x,i5,x,a,i3,x,a)' ) '::: integrateStress encountered NaN at ' , g , i , e , &
'; iteration ' , NiterationStress , &
'>> returning..!'
2009-08-24 13:46:01 +05:30
!$OMPEND CRITICAL (write2out)
endif
2009-05-07 21:57:36 +05:30
return
2009-05-28 22:08:40 +05:30
! something went wrong at accelerated speed?
elseif ( leapfrog > 1.0_pReal . and . & ! at fast pace .and.
( sum ( residuum * residuum ) > sum ( residuum_old * residuum_old ) . or . & ! worse residuum .or.
sum ( residuum * residuum_old ) < 0.0_pReal . or . & ! residuum changed sign (overshoot) .or.
any ( residuum / = residuum ) & ! NaN occured
) &
) then
2010-09-22 14:24:36 +05:30
if ( verboseDebugger ) then
!$OMP CRITICAL (write2out)
2010-09-30 13:01:53 +05:30
write ( 6 , '(a,i3,x,i2,x,i5,x,a,i3)' ) '::: integrateStress encountered high-speed crash at ' , g , i , e , &
'; iteration ' , NiterationStress
2010-09-22 14:24:36 +05:30
!$OMPEND CRITICAL (write2out)
endif
2009-05-28 22:08:40 +05:30
maxleap = 0.5_pReal * leapfrog ! limit next acceleration
leapfrog = 1.0_pReal ! grinding halt
2009-06-09 16:35:29 +05:30
jacoCounter = 0_pInt ! reset counter for Jacobian update (we want to do an update next time!)
2009-05-28 22:08:40 +05:30
! restore old residuum and Lp
Lpguess = Lpguess_old
residuum = residuum_old
2010-09-30 13:01:53 +05:30
debug_LeapfrogBreakDistribution ( NiterationStress , mode ) = debug_LeapfrogBreakDistribution ( NiterationStress , mode ) + 1
2009-05-28 22:08:40 +05:30
! residuum got better
else
! calculate Jacobian for correction term
2009-06-09 16:35:29 +05:30
if ( mod ( jacoCounter , iJacoLpresiduum ) == 0_pInt ) then
dTdLp = 0.0_pReal
2010-08-20 03:05:38 +05:30
do h = 1 , 3 ; do j = 1 , 3 ; do k = 1 , 3 ; do l = 1 , 3 ; do m = 1 , 3
! forall (h=1:3,j=1:3,k=1:3,l=1:3,m=1:3) &
2009-10-07 21:01:52 +05:30
dTdLp ( 3 * ( h - 1 ) + j , 3 * ( k - 1 ) + l ) = dTdLp ( 3 * ( h - 1 ) + j , 3 * ( k - 1 ) + l ) + C ( h , j , l , m ) * AB ( k , m ) + C ( h , j , m , l ) * BTA ( m , k )
2010-08-20 03:05:38 +05:30
enddo ; enddo ; enddo ; enddo ; enddo
2010-10-01 17:48:49 +05:30
dTdLp = - 0.5_pReal * dt * dTdLp
2009-10-07 21:01:52 +05:30
dRdLp = math_identity2nd ( 9 ) - math_mul99x99 ( dLpdT_constitutive , dTdLp )
2009-06-09 16:35:29 +05:30
invdRdLp = 0.0_pReal
call math_invert ( 9 , dRdLp , invdRdLp , dummy , error ) ! invert dR/dLp --> dLp/dR
if ( error ) then
2010-04-28 22:49:58 +05:30
if ( verboseDebugger . and . selectiveDebugger ) then
2009-07-22 21:37:19 +05:30
!$OMP CRITICAL (write2out)
2010-09-30 13:01:53 +05:30
write ( 6 , '(a,i3,x,i2,x,i5,x,a,i3)' ) '::: integrateStress failed on dR/dLp inversion at ' , g , i , e , &
'; iteration ' , NiterationStress
2009-08-24 13:46:01 +05:30
write ( 6 , * )
2010-04-28 22:49:58 +05:30
write ( 6 , '(a,/,9(9(e15.3,x)/))' ) 'dRdLp' , dRdLp
write ( 6 , '(a,/,9(9(e15.3,x)/))' ) 'dLpdT_constitutive' , dLpdT_constitutive
write ( 6 , '(a,/,3(3(e20.7,x)/))' ) 'Lp_constitutive' , Lp_constitutive
write ( 6 , '(a,/,3(3(e20.7,x)/))' ) 'Lpguess' , Lpguess
2009-07-22 21:37:19 +05:30
!$OMPEND CRITICAL (write2out)
endif
2009-06-09 16:35:29 +05:30
return
2010-09-22 14:24:36 +05:30
else
2010-09-30 13:01:53 +05:30
if ( verboseDebugger . and . selectiveDebugger ) then
2010-09-22 14:24:36 +05:30
!$OMP CRITICAL (write2out)
2010-09-30 13:01:53 +05:30
write ( 6 , '(a,i3,x,i2,x,i5,x,a,i3)' ) '::: integrateStress did dR/dLp inversion at ' , g , i , e , &
'; iteration ' , NiterationStress
2010-09-22 14:24:36 +05:30
write ( 6 , * )
write ( 6 , '(a,/,9(9(e15.3,x)/))' ) 'dRdLp' , dRdLp
write ( 6 , '(a,/,9(9(e15.3,x)/))' ) 'dLpdT_constitutive' , dLpdT_constitutive
!$OMPEND CRITICAL (write2out)
endif
2009-06-09 16:35:29 +05:30
endif
2009-05-07 21:57:36 +05:30
endif
2009-06-09 16:35:29 +05:30
jacoCounter = jacoCounter + 1_pInt ! increase counter for jaco update
2009-05-28 22:08:40 +05:30
! remember current residuum and Lpguess
residuum_old = residuum
Lpguess_old = Lpguess
! accelerate?
if ( NiterationStress > 1 . and . leapfrog < maxleap ) leapfrog = 2.0_pReal * leapfrog
2009-05-07 21:57:36 +05:30
endif
2009-05-28 22:08:40 +05:30
! leapfrog to updated Lp
2010-08-20 03:05:38 +05:30
do k = 1 , 3 ; do l = 1 , 3 ; do m = 1 , 3 ; do n = 1 , 3
2009-05-28 22:08:40 +05:30
Lpguess ( k , l ) = Lpguess ( k , l ) - leapfrog * invdRdLp ( 3 * ( k - 1 ) + l , 3 * ( m - 1 ) + n ) * residuum ( m , n )
2010-08-20 03:05:38 +05:30
enddo ; enddo ; enddo ; enddo
2009-05-28 22:08:40 +05:30
enddo LpLoop
! calculate new plastic and elastic deformation gradient
invFp_new = math_mul33x33 ( invFp_current , B )
invFp_new = invFp_new / math_det3x3 ( invFp_new ) ** ( 1.0_pReal / 3.0_pReal ) ! regularize by det
2009-05-07 21:57:36 +05:30
call math_invert3x3 ( invFp_new , Fp_new , det , error )
2009-05-28 22:08:40 +05:30
if ( error ) then
2010-04-28 22:49:58 +05:30
if ( verboseDebugger . and . selectiveDebugger ) then
2009-07-22 21:37:19 +05:30
!$OMP CRITICAL (write2out)
2010-08-04 05:17:00 +05:30
write ( 6 , '(a,i3,x,i2,x,i5,x,a,x,i3)' ) '::: integrateStress failed on invFp_new inversion at ' , g , i , e , &
' ; iteration ' , NiterationStress
2009-08-24 13:46:01 +05:30
write ( 6 , * )
write ( 6 , '(a11,3(i3,x),/,3(3(f12.7,x)/))' ) 'invFp_new at ' , g , i , e , invFp_new
2009-07-22 21:37:19 +05:30
!$OMPEND CRITICAL (write2out)
endif
2009-05-28 22:08:40 +05:30
return
2009-05-07 21:57:36 +05:30
endif
2009-05-28 22:08:40 +05:30
Fe_new = math_mul33x33 ( Fg_new , invFp_new ) ! calc resulting Fe
2009-05-07 21:57:36 +05:30
2009-05-28 22:08:40 +05:30
! add volumetric component to 2nd Piola-Kirchhoff stress
forall ( n = 1 : 3 ) Tstar_v ( n ) = Tstar_v ( n ) + p_hydro
! calculate 1st Piola-Kirchhoff stress
crystallite_P ( : , : , g , i , e ) = math_mul33x33 ( Fe_new , math_mul33x33 ( math_Mandel6to33 ( Tstar_v ) , transpose ( invFp_new ) ) )
! store local values in global variables
crystallite_Lp ( : , : , g , i , e ) = Lpguess
crystallite_Tstar_v ( : , g , i , e ) = Tstar_v
crystallite_Fp ( : , : , g , i , e ) = Fp_new
crystallite_Fe ( : , : , g , i , e ) = Fe_new
2009-08-11 22:01:57 +05:30
crystallite_invFp ( : , : , g , i , e ) = invFp_new
2009-05-07 21:57:36 +05:30
2009-05-28 22:08:40 +05:30
! set return flag to true
crystallite_integrateStress = . true .
2010-03-19 19:44:08 +05:30
if ( verboseDebugger . and . selectiveDebugger ) then
2009-07-22 21:37:19 +05:30
!$OMP CRITICAL (write2out)
2010-04-28 22:49:58 +05:30
write ( 6 , '(a,i3,x,i2,x,i5,x,a,x,i3)' ) '::: integrateStress converged at ' , g , i , e , ' ; iteration ' , NiterationStress
2009-08-13 15:34:14 +05:30
write ( 6 , * )
write ( 6 , '(a,/,3(3(f12.7,x)/))' ) 'P / MPa' , crystallite_P ( : , : , g , i , e ) / 1e6
2010-09-22 14:24:36 +05:30
write ( 6 , '(a,/,3(3(f12.7,x)/))' ) 'Cauchy / MPa' , math_mul33x33 ( crystallite_P ( : , : , g , i , e ) , transpose ( Fg_new ) ) / 1e6 / math_det3x3 ( Fg_new )
write ( 6 , '(a,/,3(3(f12.7,x)/))' ) 'Fe Lp Fe^-1' , math_mul33x33 ( Fe_new , math_mul33x33 ( crystallite_Lp ( : , : , g , i , e ) , math_inv3x3 ( Fe_new ) ) )
2009-08-24 13:46:01 +05:30
write ( 6 , '(a,/,3(3(f12.7,x)/))' ) 'Fp' , crystallite_Fp ( : , : , g , i , e )
2010-04-06 12:17:15 +05:30
!$OMP END CRITICAL (write2out)
2009-06-09 16:35:29 +05:30
endif
2009-05-07 21:57:36 +05:30
2009-06-10 20:38:33 +05:30
!$OMP CRITICAL (distributionStress)
2010-09-06 21:36:41 +05:30
debug_StressLoopDistribution ( NiterationStress , mode ) = debug_StressLoopDistribution ( NiterationStress , mode ) + 1
2009-06-10 20:38:33 +05:30
!$OMPEND CRITICAL (distributionStress)
2009-05-07 21:57:36 +05:30
2009-05-28 22:08:40 +05:30
return
2009-05-07 21:57:36 +05:30
2009-05-28 22:08:40 +05:30
endfunction
2009-05-07 21:57:36 +05:30
2009-12-18 21:16:33 +05:30
!********************************************************************
2010-04-28 22:49:58 +05:30
! calculates orientations and disorientations (in case of single grain ips)
2009-12-18 21:16:33 +05:30
!********************************************************************
subroutine crystallite_orientations ( )
!*** variables and functions from other modules ***!
2010-02-19 19:14:38 +05:30
use prec , only : pInt , &
pReal
use math , only : math_pDecomposition , &
2010-03-18 17:53:17 +05:30
math_RtoQuaternion , &
2010-04-28 22:49:58 +05:30
math_QuaternionDisorientation , &
2010-05-11 20:36:21 +05:30
inDeg , &
math_qConj
2010-02-19 19:14:38 +05:30
use FEsolving , only : FEsolving_execElem , &
FEsolving_execIP
use IO , only : IO_warning
use material , only : material_phase , &
homogenization_Ngrains , &
2010-04-29 13:11:29 +05:30
phase_constitution
2010-02-19 19:14:38 +05:30
use mesh , only : mesh_element , &
mesh_ipNeighborhood , &
FE_NipNeighbors
2010-04-29 13:11:29 +05:30
use debug , only : debugger , &
debug_e , debug_i , debug_g , &
verboseDebugger , &
selectiveDebugger
use constitutive_nonlocal , only : constitutive_nonlocal_label
2009-12-18 21:16:33 +05:30
implicit none
!*** input variables ***!
!*** output variables ***!
!*** local variables ***!
2010-02-19 19:14:38 +05:30
integer ( pInt ) e , & ! element index
i , & ! integration point index
g , & ! grain index
n , & ! neighbor index
2010-04-19 15:33:34 +05:30
myPhase , & ! phase
2010-02-19 19:14:38 +05:30
neighboring_e , & ! element index of my neighbor
neighboring_i , & ! integration point index of my neighbor
neighboringPhase , & ! phase of my neighbor
2010-04-19 15:33:34 +05:30
neighboringStructure ! lattice structure of my neighbor
2010-03-18 17:53:17 +05:30
real ( pReal ) , dimension ( 3 , 3 ) :: U , R
2009-12-18 21:16:33 +05:30
logical error
!$OMP PARALLEL DO
2010-02-19 19:14:38 +05:30
do e = FEsolving_execElem ( 1 ) , FEsolving_execElem ( 2 )
do i = FEsolving_execIP ( 1 , e ) , FEsolving_execIP ( 2 , e )
do g = 1 , homogenization_Ngrains ( mesh_element ( 3 , e ) )
2010-04-12 16:44:36 +05:30
2010-02-19 19:14:38 +05:30
! calculate orientation in terms of rotation matrix and euler angles
2010-04-28 22:49:58 +05:30
call math_pDecomposition ( crystallite_Fe ( : , : , g , i , e ) , U , R , error ) ! polar decomposition of Fe
2010-02-19 19:14:38 +05:30
if ( error ) then
call IO_warning ( 650 , e , i , g )
2010-03-18 17:53:17 +05:30
crystallite_orientation ( : , g , i , e ) = ( / 1.0_pReal , 0.0_pReal , 0.0_pReal , 0.0_pReal / ) ! fake orientation
2010-02-19 19:14:38 +05:30
else
2010-05-11 20:36:21 +05:30
crystallite_orientation ( : , g , i , e ) = math_RtoQuaternion ( transpose ( R ) )
2010-02-19 19:14:38 +05:30
endif
2010-04-28 22:49:58 +05:30
crystallite_rotation ( : , g , i , e ) = &
2010-05-11 20:36:21 +05:30
math_QuaternionDisorientation ( math_qConj ( crystallite_orientation ( : , g , i , e ) ) , & ! calculate grainrotation
math_qConj ( crystallite_orientation0 ( : , g , i , e ) ) , &
2010-05-07 17:31:46 +05:30
0_pInt ) ! we don't want symmetry here
2010-04-29 13:11:29 +05:30
2010-04-12 16:44:36 +05:30
enddo
enddo
enddo
!$OMPEND PARALLEL DO
!$OMP PARALLEL DO
! Another loop for nonlocal material which uses the orientations from the first one.
do e = FEsolving_execElem ( 1 ) , FEsolving_execElem ( 2 )
do i = FEsolving_execIP ( 1 , e ) , FEsolving_execIP ( 2 , e )
2010-04-29 13:11:29 +05:30
selectiveDebugger = ( e == debug_e . and . i == debug_i )
2010-04-12 16:44:36 +05:30
myPhase = material_phase ( 1 , i , e ) ! get my crystal structure
if ( phase_constitution ( myPhase ) == constitutive_nonlocal_label ) then ! if nonlocal model
2010-04-19 15:33:34 +05:30
do n = 1 , FE_NipNeighbors ( mesh_element ( 2 , e ) ) ! loop through my neighbors
2010-02-19 19:14:38 +05:30
neighboring_e = mesh_ipNeighborhood ( 1 , n , i , e )
neighboring_i = mesh_ipNeighborhood ( 2 , n , i , e )
if ( ( neighboring_e > 0 ) . and . ( neighboring_i > 0 ) ) then ! if neighbor exists
neighboringPhase = material_phase ( 1 , neighboring_i , neighboring_e ) ! get my neighbor's crystal structure
if ( myPhase == neighboringPhase ) then ! if my neighbor has same phase like me
2010-04-28 22:49:58 +05:30
crystallite_disorientation ( : , n , 1 , i , e ) = &
math_QuaternionDisorientation ( crystallite_orientation ( : , 1 , i , e ) , &
crystallite_orientation ( : , 1 , neighboring_i , neighboring_e ) , &
crystallite_symmetryID ( 1 , i , e ) ) ! calculate disorientation
2010-02-19 19:14:38 +05:30
else ! for neighbor with different phase
2010-04-29 17:58:51 +05:30
crystallite_disorientation ( : , n , 1 , i , e ) = ( / 0.0_pReal , 1.0_pReal , 0.0_pReal , 0.0_pReal / ) ! 180 degree rotation about 100 axis
2010-02-19 19:14:38 +05:30
endif
else ! no existing neighbor
2010-04-28 22:49:58 +05:30
crystallite_disorientation ( : , n , 1 , i , e ) = ( / - 1.0_pReal , 0.0_pReal , 0.0_pReal , 0.0_pReal / ) ! homomorphic identity
2010-02-19 19:14:38 +05:30
endif
2010-04-29 13:11:29 +05:30
if ( verboseDebugger . and . selectiveDebugger ) then
!$OMP CRITICAL (write2out)
write ( 6 , '(a27,i2,a3,4(f12.5,x))' ) 'disorientation to neighbor ' , n , ' : ' , crystallite_disorientation ( : , n , 1 , i , e )
!$OMP END CRITICAL (write2out)
endif
2010-02-19 19:14:38 +05:30
enddo
endif
enddo
enddo
2009-12-18 21:16:33 +05:30
!$OMPEND PARALLEL DO
endsubroutine
2009-06-09 16:35:29 +05:30
2009-05-07 21:57:36 +05:30
!********************************************************************
! return results of particular grain
!********************************************************************
function crystallite_postResults ( &
dt , & ! time increment
g , & ! grain number
i , & ! integration point number
e & ! element number
)
2009-06-09 16:35:29 +05:30
!*** variables and functions from other modules ***!
use prec , only : pInt , &
pReal
2010-04-12 16:44:36 +05:30
use math , only : math_QuaternionToEuler , &
2010-05-07 17:31:46 +05:30
math_QuaternionToAxisAngle , &
2010-05-18 13:27:13 +05:30
math_mul33x33 , &
math_I3 , &
inDeg , &
math_Mandel6to33
2010-02-25 23:09:11 +05:30
use mesh , only : mesh_element
use material , only : microstructure_crystallite , &
crystallite_Noutput , &
material_phase , &
2009-06-09 16:35:29 +05:30
material_volume
use constitutive , only : constitutive_sizePostResults , &
constitutive_postResults
2009-05-07 21:57:36 +05:30
implicit none
2009-06-09 16:35:29 +05:30
!*** input variables ***!
integer ( pInt ) , intent ( in ) :: e , & ! element index
i , & ! integration point index
g ! grain index
constitutive_nonlocal:
- read in activation energy for dislocation glide from material.config
- changed naming of dDipMin/Max to dLower/dUpper
- added new outputs: rho_dot, rho_dot_dip, rho_dot_gen, rho_dot_sgl2dip, rho_dot_dip2sgl, rho_dot_ann_ath, rho_dot_ann_the, rho_dot_flux, d_upper_edge, d_upper_screw, d_upper_dot_edge, d_upper_dot_screw
- poisson's ratio is now calculated from elastic constants
- microstrucutre has state as first argument, since this is our output variable
- periodic boundary conditions are taken into account for fluxes and internal stresses. for the moment, flag has to be set in constitutive_nonlocal.
- corrected calculation for dipole formation by glide
- added terms for dipole formation/annihilation by stress decrease/increase
constitutive:
- passing of arguments is adapted for constitutive_nonlocal model
crystallite:
- in stiffness calculation: call to collect_dotState used wrong arguments
- crystallite_postResults uses own Tstar_v and temperature, no need for passing them from materialpoint_postResults
homogenization:
- crystallite_postResults uses own Tstar_v and temperature, no need for passing them from materialpoint_postResults
IO:
- changed error message 229
material.config:
- changed example for nonlocal constitution according to constitutive_nonlocal
all:
- added some flush statements
2009-10-20 20:06:03 +05:30
real ( pReal ) , intent ( in ) :: dt ! time increment
2009-05-07 21:57:36 +05:30
2009-06-09 16:35:29 +05:30
!*** output variables ***!
2010-02-25 23:09:11 +05:30
real ( pReal ) , dimension ( 1 + crystallite_sizePostResults ( microstructure_crystallite ( mesh_element ( 4 , e ) ) ) + &
1 + constitutive_sizePostResults ( g , i , e ) ) :: crystallite_postResults
2009-05-07 21:57:36 +05:30
2009-06-09 16:35:29 +05:30
!*** local variables ***!
2010-05-18 18:06:09 +05:30
real ( pReal ) , dimension ( 3 , 3 ) :: Ee
integer ( pInt ) k , l , o , c , crystID , mySize
2010-02-25 23:09:11 +05:30
logical error
crystID = microstructure_crystallite ( mesh_element ( 4 , e ) )
crystallite_postResults = 0.0_pReal
c = 0_pInt
crystallite_postResults ( c + 1 ) = crystallite_sizePostResults ( crystID ) ; c = c + 1_pInt ! size of results from cryst
2009-05-07 21:57:36 +05:30
2010-02-25 23:09:11 +05:30
do o = 1 , crystallite_Noutput ( crystID )
select case ( crystallite_output ( o , crystID ) )
case ( 'phase' )
crystallite_postResults ( c + 1 ) = material_phase ( g , i , e ) ! phaseID of grain
c = c + 1_pInt
case ( 'volume' )
crystallite_postResults ( c + 1 ) = material_volume ( g , i , e ) ! grain volume (not fraction but absolute, right?)
c = c + 1_pInt
case ( 'orientation' )
2010-04-12 16:44:36 +05:30
crystallite_postResults ( c + 1 : c + 4 ) = &
2010-10-01 17:48:49 +05:30
crystallite_orientation ( : , g , i , e ) ! grain orientation as quaternion
2010-03-18 17:53:17 +05:30
c = c + 4_pInt
case ( 'eulerangles' )
2010-05-07 17:31:46 +05:30
crystallite_postResults ( c + 1 : c + 3 ) = inDeg * &
2010-10-01 17:48:49 +05:30
math_QuaternionToEuler ( crystallite_orientation ( : , g , i , e ) ) ! grain orientation as Euler angles in degree
2010-02-25 23:09:11 +05:30
c = c + 3_pInt
2010-04-12 16:44:36 +05:30
case ( 'grainrotation' )
crystallite_postResults ( c + 1 : c + 4 ) = &
2010-10-01 17:48:49 +05:30
math_QuaternionToAxisAngle ( crystallite_rotation ( 1 : 4 , g , i , e ) ) ! grain rotation away from initial orientation as axis-angle
crystallite_postResults ( c + 4 ) = inDeg * crystallite_postResults ( c + 4 ) ! angle in degree
2010-04-12 16:44:36 +05:30
c = c + 4_pInt
2010-05-18 13:27:13 +05:30
case ( 'defgrad' , 'f' )
mySize = 9_pInt
crystallite_postResults ( c + 1 : c + 1 + mySize ) = reshape ( crystallite_partionedF ( : , : , g , i , e ) , ( / mySize / ) )
c = c + mySize
case ( 'fe' )
mySize = 9_pInt
crystallite_postResults ( c + 1 : c + 1 + mySize ) = reshape ( crystallite_Fe ( : , : , g , i , e ) , ( / mySize / ) )
c = c + mySize
case ( 'ee' )
Ee = 0.5_pReal * ( math_mul33x33 ( transpose ( crystallite_Fe ( : , : , g , i , e ) ) , crystallite_Fe ( : , : , g , i , e ) ) - math_I3 )
mySize = 9_pInt
crystallite_postResults ( c + 1 : c + 1 + mySize ) = reshape ( Ee ( : , : ) , ( / mySize / ) )
c = c + mySize
case ( 'fp' )
mySize = 9_pInt
crystallite_postResults ( c + 1 : c + 1 + mySize ) = reshape ( crystallite_Fp ( : , : , g , i , e ) , ( / mySize / ) )
c = c + mySize
case ( 'p' , 'firstpiola' , '1stpiola' )
mySize = 9_pInt
crystallite_postResults ( c + 1 : c + 1 + mySize ) = reshape ( crystallite_P ( : , : , g , i , e ) , ( / mySize / ) )
c = c + mySize
case ( 's' , 'tstar' , 'secondpiola' , '2ndpiola' )
mySize = 9_pInt
crystallite_postResults ( c + 1 : c + 1 + mySize ) = reshape ( math_Mandel6to33 ( crystallite_Tstar_v ( : , g , i , e ) ) , ( / mySize / ) )
c = c + mySize
2010-02-25 23:09:11 +05:30
end select
enddo
2009-10-22 22:29:24 +05:30
crystallite_postResults ( c + 1 ) = constitutive_sizePostResults ( g , i , e ) ; c = c + 1_pInt ! size of constitutive results
crystallite_postResults ( c + 1 : c + constitutive_sizePostResults ( g , i , e ) ) = &
2010-10-01 17:48:49 +05:30
constitutive_postResults ( crystallite_Tstar_v ( : , g , i , e ) , crystallite_subTstar0_v ( : , g , i , e ) , crystallite_Fe , crystallite_Fp , &
2010-04-28 22:49:58 +05:30
crystallite_Temperature ( g , i , e ) , crystallite_disorientation ( : , : , g , i , e ) , dt , &
2009-12-18 21:16:33 +05:30
crystallite_subdt ( g , i , e ) , g , i , e )
2009-12-15 13:50:31 +05:30
c = c + constitutive_sizePostResults ( g , i , e )
constitutive_nonlocal:
- read in activation energy for dislocation glide from material.config
- changed naming of dDipMin/Max to dLower/dUpper
- added new outputs: rho_dot, rho_dot_dip, rho_dot_gen, rho_dot_sgl2dip, rho_dot_dip2sgl, rho_dot_ann_ath, rho_dot_ann_the, rho_dot_flux, d_upper_edge, d_upper_screw, d_upper_dot_edge, d_upper_dot_screw
- poisson's ratio is now calculated from elastic constants
- microstrucutre has state as first argument, since this is our output variable
- periodic boundary conditions are taken into account for fluxes and internal stresses. for the moment, flag has to be set in constitutive_nonlocal.
- corrected calculation for dipole formation by glide
- added terms for dipole formation/annihilation by stress decrease/increase
constitutive:
- passing of arguments is adapted for constitutive_nonlocal model
crystallite:
- in stiffness calculation: call to collect_dotState used wrong arguments
- crystallite_postResults uses own Tstar_v and temperature, no need for passing them from materialpoint_postResults
homogenization:
- crystallite_postResults uses own Tstar_v and temperature, no need for passing them from materialpoint_postResults
IO:
- changed error message 229
material.config:
- changed example for nonlocal constitution according to constitutive_nonlocal
all:
- added some flush statements
2009-10-20 20:06:03 +05:30
2009-05-07 21:57:36 +05:30
return
2009-05-28 22:08:40 +05:30
endfunction
2009-05-07 21:57:36 +05:30
END MODULE
2009-05-28 22:08:40 +05:30
!##############################################################