added doxygen comments, some polishing, added "protected" statements where applicable

This commit is contained in:
Martin Diehl 2012-10-02 12:53:25 +00:00
parent 6301787df4
commit 0bcb8f59db
6 changed files with 129 additions and 131 deletions

View File

@ -1,7 +1,7 @@
! Copyright 2011 Max-Planck-Institut für Eisenforschung GmbH ! Copyright 2011 Max-Planck-Institut für Eisenforschung GmbH
! !
! This file is part of DAMASK, ! This file is part of DAMASK,
! the Düsseldorf Advanced MAterial Simulation Kit. ! the Düsseldorf Advanced Material Simulation Kit.
! !
! DAMASK is free software: you can redistribute it and/or modify ! DAMASK is free software: you can redistribute it and/or modify
! it under the terms of the GNU General Public License as published by ! it under the terms of the GNU General Public License as published by
@ -29,13 +29,13 @@ implicit none
real(pReal), parameter :: CPFEM_odd_stress = 1e15_pReal, & real(pReal), parameter :: CPFEM_odd_stress = 1e15_pReal, &
CPFEM_odd_jacobian = 1e50_pReal CPFEM_odd_jacobian = 1e50_pReal
real(pReal), dimension (:,:,:), allocatable :: CPFEM_cs ! Cauchy stress real(pReal), dimension (:,:,:), allocatable :: CPFEM_cs !> Cauchy stress
real(pReal), dimension (:,:,:,:), allocatable :: CPFEM_dcsdE ! Cauchy stress tangent real(pReal), dimension (:,:,:,:), allocatable :: CPFEM_dcsdE !> Cauchy stress tangent
real(pReal), dimension (:,:,:,:), allocatable :: CPFEM_dcsdE_knownGood ! known good tangent real(pReal), dimension (:,:,:,:), allocatable :: CPFEM_dcsdE_knownGood !> known good tangent
logical :: CPFEM_init_done = .false., & ! remember whether init has been done already logical :: CPFEM_init_done = .false., & !> remember whether init has been done already
CPFEM_init_inProgress = .false., & ! remember whether first IP is currently performing init CPFEM_init_inProgress = .false., & !> remember whether first IP is currently performing init
CPFEM_calc_done = .false. ! remember whether first IP has already calced the results CPFEM_calc_done = .false. !> remember whether first IP has already calced the results
CONTAINS CONTAINS

View File

@ -16,42 +16,41 @@
! You should have received a copy of the GNU General Public License ! You should have received a copy of the GNU General Public License
! along with DAMASK. If not, see <http://www.gnu.org/licenses/>. ! along with DAMASK. If not, see <http://www.gnu.org/licenses/>.
! !
!############################################################## !--------------------------------------------------------------------------------------------------
!* $Id$ !* $Id$
!************************************ !--------------------------------------------------------------------------------------------------
!* Module: CONSTITUTIVE * !> @author Franz Roters, Max-Planck-Institut für Eisenforschung GmbH
!************************************ !! Philip Eisenlohr, Max-Planck-Institut für Eisenforschung GmbH
!* contains: * !> @brief elasticity, plasticity, internal microstructure state
!* - constitutive equations * !--------------------------------------------------------------------------------------------------
!* - parameters definition *
!************************************
MODULE constitutive module constitutive
use prec, only: pInt, p_vec use prec, only: pInt, p_vec
implicit none implicit none
!private
type(p_vec), dimension(:,:,:), allocatable :: & type(p_vec), dimension(:,:,:), allocatable :: &
constitutive_state0, & ! pointer array to microstructure at start of FE inc constitutive_state0, & !< pointer array to microstructure at start of FE inc
constitutive_partionedState0, & ! pointer array to microstructure at start of homogenization inc constitutive_partionedState0, & !< pointer array to microstructure at start of homogenization inc
constitutive_subState0, & ! pointer array to microstructure at start of crystallite inc constitutive_subState0, & !< pointer array to microstructure at start of crystallite inc
constitutive_state, & ! pointer array to current microstructure (end of converged time step) constitutive_state, & !< pointer array to current microstructure (end of converged time step)
constitutive_state_backup, & ! pointer array to backed up microstructure (end of converged time step) constitutive_state_backup, & !< pointer array to backed up microstructure (end of converged time step)
constitutive_dotState, & ! pointer array to evolution of current microstructure constitutive_dotState, & !< pointer array to evolution of current microstructure
constitutive_deltaState, & ! pointer array to incremental change of current microstructure constitutive_deltaState, & !< pointer array to incremental change of current microstructure
constitutive_previousDotState,& ! pointer array to previous evolution of current microstructure constitutive_previousDotState,& !< pointer array to previous evolution of current microstructure
constitutive_previousDotState2,& ! pointer array to 2nd previous evolution of current microstructure constitutive_previousDotState2,& !< pointer array to 2nd previous evolution of current microstructure
constitutive_dotState_backup, & ! pointer array to backed up evolution of current microstructure constitutive_dotState_backup, & !< pointer array to backed up evolution of current microstructure
constitutive_RK4dotState, & ! pointer array to evolution of microstructure defined by classical Runge-Kutta method constitutive_RK4dotState, & !< pointer array to evolution of microstructure defined by classical Runge-Kutta method
constitutive_aTolState ! pointer array to absolute state tolerance constitutive_aTolState !< pointer array to absolute state tolerance
type(p_vec), dimension(:,:,:,:), allocatable :: & type(p_vec), dimension(:,:,:,:), allocatable :: &
constitutive_RKCK45dotState ! pointer array to evolution of microstructure used by Cash-Karp Runge-Kutta method constitutive_RKCK45dotState !< pointer array to evolution of microstructure used by Cash-Karp Runge-Kutta method
integer(pInt), dimension(:,:,:), allocatable :: & integer(pInt), dimension(:,:,:), allocatable :: &
constitutive_sizeDotState, & ! size of dotState array constitutive_sizeDotState, & !< size of dotState array
constitutive_sizeState, & ! size of state array per grain constitutive_sizeState, & !< size of state array per grain
constitutive_sizePostResults ! size of postResults array per grain constitutive_sizePostResults !< size of postResults array per grain
integer(pInt) :: & integer(pInt) :: &
constitutive_maxSizeDotState, & constitutive_maxSizeDotState, &
@ -60,25 +59,26 @@ integer(pInt) :: &
character (len=*), parameter, public :: constitutive_hooke_label = 'hooke' character (len=*), parameter, public :: constitutive_hooke_label = 'hooke'
public :: &
constitutive_init, &
constitutive_homogenizedC, &
constitutive_averageBurgers, &
constitutive_microstructure, &
constitutive_LpAndItsTangent, &
constitutive_TandItsTangent, &
constitutive_collectDotState, &
constitutive_collectDeltaState, &
constitutive_postResults
private :: &
constitutive_hooke_TandItsTangent
contains contains
!****************************************
!* - constitutive_init
!* - constitutive_homogenizedC
!* - constitutive_averageBurgers
!* - constitutive_microstructure
!* - constitutive_LpAndItsTangent
!* - constitutive_TandItsTangent
!* - constitutive_hooke_TandItsTangent
!* - constitutive_collectDotState
!* - constitutive_collectDeltaState
!* - constitutive_collectDotTemperature
!* - constitutive_postResults
!****************************************
!************************************** !--------------------------------------------------------------------------------------------------
!* Module initialization * !> @brief allocates arrays pointing to array of the various constitutive modules
!************************************** !--------------------------------------------------------------------------------------------------
subroutine constitutive_init subroutine constitutive_init
use, intrinsic :: iso_fortran_env ! to get compiler_version and compiler_options (at least for gfortran 4.6 at the moment) use, intrinsic :: iso_fortran_env ! to get compiler_version and compiler_options (at least for gfortran 4.6 at the moment)
use debug, only: debug_level, & use debug, only: debug_level, &
@ -447,18 +447,18 @@ constitutive_maxSizePostResults = maxval(constitutive_sizePostResults)
call flush(6) call flush(6)
!$OMP END CRITICAL (write2out) !$OMP END CRITICAL (write2out)
endsubroutine end subroutine constitutive_init
function constitutive_homogenizedC(ipc,ip,el)
!********************************************************************* !*********************************************************************
!* This function returns the homogenized elacticity matrix * !* This function returns the homogenized elacticity matrix *
!* INPUT: * !* INPUT: *
!* - state : state variables *
!* - ipc : component-ID of current integration point * !* - ipc : component-ID of current integration point *
!* - ip : current integration point * !* - ip : current integration point *
!* - el : current element * !* - el : current element *
!********************************************************************* !*********************************************************************
function constitutive_homogenizedC(ipc,ip,el)
use prec, only: pReal use prec, only: pReal
use material, only: phase_plasticity,material_phase use material, only: phase_plasticity,material_phase
use constitutive_none use constitutive_none
@ -494,10 +494,9 @@ function constitutive_homogenizedC(ipc,ip,el)
end select end select
return end function constitutive_homogenizedC
endfunction
function constitutive_averageBurgers(ipc,ip,el)
!********************************************************************* !*********************************************************************
!* This function returns the average length of Burgers vector * !* This function returns the average length of Burgers vector *
!* INPUT: * !* INPUT: *
@ -506,6 +505,8 @@ function constitutive_averageBurgers(ipc,ip,el)
!* - ip : current integration point * !* - ip : current integration point *
!* - el : current element * !* - el : current element *
!********************************************************************* !*********************************************************************
function constitutive_averageBurgers(ipc,ip,el)
use prec, only: pReal use prec, only: pReal
use material, only: phase_plasticity,material_phase use material, only: phase_plasticity,material_phase
use constitutive_none use constitutive_none
@ -541,8 +542,7 @@ function constitutive_averageBurgers(ipc,ip,el)
end select end select
return end function constitutive_averageBurgers
endfunction
@ -666,7 +666,7 @@ select case (phase_plasticity(material_phase(ipc,ip,el)))
end select end select
endsubroutine end subroutine constitutive_LpAndItsTangent
@ -700,8 +700,6 @@ subroutine constitutive_TandItsTangent(T, dT_dFe, Fe, ipc, ip, el)
end select end select
return
end subroutine constitutive_TandItsTangent end subroutine constitutive_TandItsTangent
@ -831,7 +829,7 @@ if (iand(debug_level(debug_constitutive), debug_levelBasic) /= 0_pInt) then
!$OMP END CRITICAL (debugTimingDotState) !$OMP END CRITICAL (debugTimingDotState)
endif endif
endsubroutine end subroutine constitutive_collectDotState
!********************************************************************* !*********************************************************************
@ -914,7 +912,7 @@ if (iand(debug_level(debug_constitutive), debug_levelBasic) /= 0_pInt) then
!$OMP END CRITICAL (debugTimingDeltaState) !$OMP END CRITICAL (debugTimingDeltaState)
endif endif
endsubroutine end subroutine constitutive_collectDeltaState
@ -999,11 +997,10 @@ if (iand(debug_level(debug_constitutive),debug_levelBasic) /= 0_pInt) then
!$OMP END CRITICAL (debugTimingDotTemperature) !$OMP END CRITICAL (debugTimingDotTemperature)
endif endif
endfunction end function constitutive_dotTemperature
function constitutive_postResults(Tstar_v, Fe, Temperature, dt, ipc, ip, el)
!********************************************************************* !*********************************************************************
!* return array of constitutive results * !* return array of constitutive results *
!* INPUT: * !* INPUT: *
@ -1013,6 +1010,7 @@ function constitutive_postResults(Tstar_v, Fe, Temperature, dt, ipc, ip, el)
!* - ip : current integration point * !* - ip : current integration point *
!* - el : current element * !* - el : current element *
!********************************************************************* !*********************************************************************
function constitutive_postResults(Tstar_v, Fe, Temperature, dt, ipc, ip, el)
use prec, only: pReal use prec, only: pReal
use mesh, only: mesh_NcpElems, & use mesh, only: mesh_NcpElems, &
mesh_maxNips mesh_maxNips
@ -1073,7 +1071,7 @@ select case (phase_plasticity(material_phase(ipc,ip,el)))
constitutive_dotstate(ipc,ip,el), ipc, ip, el) constitutive_dotstate(ipc,ip,el), ipc, ip, el)
end select end select
endfunction end function constitutive_postResults
END MODULE end module constitutive

View File

@ -45,38 +45,38 @@ module lattice
lattice_maxNtwin = 24_pInt, & !< max # of twin systems over lattice structures lattice_maxNtwin = 24_pInt, & !< max # of twin systems over lattice structures
lattice_maxNinteraction = 30_pInt !< max # of interaction types (in hardening matrix part) lattice_maxNinteraction = 30_pInt !< max # of interaction types (in hardening matrix part)
integer(pInt), allocatable, dimension(:,:), public :: & integer(pInt), allocatable, dimension(:,:), protected, public :: &
lattice_NslipSystem, & !< # of slip systems in each family lattice_NslipSystem, & !< # of slip systems in each family
lattice_NtwinSystem !< # of twin systems in each family lattice_NtwinSystem !< # of twin systems in each family
integer(pInt), allocatable, dimension(:,:,:), public :: & integer(pInt), allocatable, dimension(:,:,:), protected, public :: &
lattice_interactionSlipSlip, & !< interaction type between slip/slip lattice_interactionSlipSlip, & !< interaction type between slip/slip
lattice_interactionSlipTwin, & !< interaction type between slip/twin lattice_interactionSlipTwin, & !< interaction type between slip/twin
lattice_interactionTwinSlip, & !< interaction type between twin/slip lattice_interactionTwinSlip, & !< interaction type between twin/slip
lattice_interactionTwinTwin !< interaction type between twin/twin lattice_interactionTwinTwin !< interaction type between twin/twin
real(pReal), allocatable, dimension(:,:,:,:), public :: & real(pReal), allocatable, dimension(:,:,:,:), protected, public :: &
lattice_Sslip !< Schmid matrices, normal, shear direction and d x n of slip systems lattice_Sslip !< Schmid matrices, normal, shear direction and d x n of slip systems
real(pReal), allocatable, dimension(:,:,:), public :: & real(pReal), allocatable, dimension(:,:,:), protected, public :: &
lattice_Sslip_v, & lattice_Sslip_v, &
lattice_sn, & lattice_sn, &
lattice_sd, & lattice_sd, &
lattice_st lattice_st
! rotation and Schmid matrices, normal, shear direction and d x n of twin systems ! rotation and Schmid matrices, normal, shear direction and d x n of twin systems
real(pReal), allocatable, dimension(:,:,:,:), public :: & real(pReal), allocatable, dimension(:,:,:,:), protected, public :: &
lattice_Stwin, & lattice_Stwin, &
lattice_Qtwin lattice_Qtwin
real(pReal), allocatable, dimension(:,:,:), public :: & real(pReal), allocatable, dimension(:,:,:), protected, public :: &
lattice_Stwin_v, & lattice_Stwin_v, &
lattice_tn, & lattice_tn, &
lattice_td, & lattice_td, &
lattice_tt lattice_tt
real(pReal), allocatable, dimension(:,:), public :: & real(pReal), allocatable, dimension(:,:), protected, public :: &
lattice_shearTwin !< characteristic twin shear lattice_shearTwin !< characteristic twin shear
integer(pInt), private :: & integer(pInt), private :: &