2013-03-01 17:18:29 +05:30
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
|
|
|
|
!> @author Philip Eisenlohr, Max-Planck-Institut für Eisenforschung GmbH
|
|
|
|
|
!> @author Franz Roters, Max-Planck-Institut für Eisenforschung GmbH
|
|
|
|
|
!> @author Luc Hantcherli, Max-Planck-Institut für Eisenforschung GmbH
|
|
|
|
|
!> @author W.A. Counts
|
|
|
|
|
!> @author Denny Tjahjanto, Max-Planck-Institut für Eisenforschung GmbH
|
|
|
|
|
!> @author Christoph Kords, Max-Planck-Institut für Eisenforschung GmbH
|
2018-07-10 11:54:45 +05:30
|
|
|
|
!> @author Martin Diehl, Max-Planck-Institut für Eisenforschung GmbH
|
|
|
|
|
!> @brief Interfaces DAMASK with MSC.Marc
|
2013-04-09 15:38:00 +05:30
|
|
|
|
!> @details Usage:
|
|
|
|
|
!> @details - choose material as hypela2
|
|
|
|
|
!> @details - set statevariable 2 to index of homogenization
|
|
|
|
|
!> @details - set statevariable 3 to index of microstructure
|
2013-10-17 18:22:46 +05:30
|
|
|
|
!> @details - use nonsymmetric option for solver (e.g. direct profile or multifrontal sparse, the latter seems to be faster!)
|
|
|
|
|
!> @details - in case of ddm (domain decomposition) a SYMMETRIC solver has to be used, i.e uncheck "non-symmetric"
|
2013-04-09 15:38:00 +05:30
|
|
|
|
!> @details Marc subroutines used:
|
|
|
|
|
!> @details - hypela2
|
|
|
|
|
!> @details - plotv
|
2019-05-05 15:36:55 +05:30
|
|
|
|
!> @details - uedinc
|
2019-02-27 13:53:05 +05:30
|
|
|
|
!> @details - flux
|
2013-04-09 15:38:00 +05:30
|
|
|
|
!> @details - quit
|
|
|
|
|
!> @details Marc common blocks included:
|
|
|
|
|
!> @details - concom: lovl, inc
|
|
|
|
|
!> @details - creeps: timinc
|
2013-03-01 17:18:29 +05:30
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
2018-07-10 11:54:45 +05:30
|
|
|
|
#define QUOTE(x) #x
|
|
|
|
|
#define PASTE(x,y) x ## y
|
|
|
|
|
|
|
|
|
|
#include "prec.f90"
|
|
|
|
|
|
2012-03-09 01:55:28 +05:30
|
|
|
|
module DAMASK_interface
|
2016-07-20 12:14:12 +05:30
|
|
|
|
|
2012-06-15 21:40:21 +05:30
|
|
|
|
implicit none
|
2018-07-10 11:54:45 +05:30
|
|
|
|
private
|
|
|
|
|
character(len=4), parameter, public :: InputFileExtension = '.dat'
|
|
|
|
|
character(len=4), parameter, public :: LogFileExtension = '.log'
|
|
|
|
|
|
|
|
|
|
public :: &
|
|
|
|
|
DAMASK_interface_init, &
|
|
|
|
|
getSolverJobName
|
2009-10-12 21:31:49 +05:30
|
|
|
|
|
2012-03-09 01:55:28 +05:30
|
|
|
|
contains
|
2009-08-31 20:51:15 +05:30
|
|
|
|
|
2013-03-01 17:18:29 +05:30
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
2018-07-10 11:54:45 +05:30
|
|
|
|
!> @brief reports and sets working directory
|
2013-03-01 17:18:29 +05:30
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
2012-03-09 01:55:28 +05:30
|
|
|
|
subroutine DAMASK_interface_init
|
2019-02-16 16:00:56 +05:30
|
|
|
|
#if __INTEL_COMPILER >= 1800
|
|
|
|
|
use, intrinsic :: iso_fortran_env, only: &
|
|
|
|
|
compiler_version, &
|
|
|
|
|
compiler_options
|
|
|
|
|
#endif
|
2018-07-10 11:54:45 +05:30
|
|
|
|
use ifport, only: &
|
|
|
|
|
CHDIR
|
2010-11-03 20:09:18 +05:30
|
|
|
|
|
2013-04-09 15:38:00 +05:30
|
|
|
|
implicit none
|
2016-02-03 14:22:11 +05:30
|
|
|
|
integer, dimension(8) :: &
|
2019-03-09 15:19:56 +05:30
|
|
|
|
dateAndTime
|
2018-07-10 11:54:45 +05:30
|
|
|
|
integer :: ierr
|
|
|
|
|
character(len=1024) :: wd
|
2016-02-03 14:22:11 +05:30
|
|
|
|
|
2019-03-09 15:19:56 +05:30
|
|
|
|
write(6,'(/,a)') ' <<<+- DAMASK_marc init -+>>>'
|
|
|
|
|
|
2019-03-13 03:26:09 +05:30
|
|
|
|
write(6,'(/,a)') ' Roters et al., Computational Materials Science 158:420–478, 2019'
|
2019-03-09 15:19:56 +05:30
|
|
|
|
write(6,'(a)') ' https://doi.org/10.1016/j.commatsci.2018.04.030'
|
2019-02-16 03:24:38 +05:30
|
|
|
|
|
2019-03-09 15:19:56 +05:30
|
|
|
|
write(6,'(/,a)') ' Version: '//DAMASKVERSION
|
2019-02-16 03:24:38 +05:30
|
|
|
|
|
2019-03-09 15:19:56 +05:30
|
|
|
|
! https://github.com/jeffhammond/HPCInfo/blob/master/docs/Preprocessor-Macros.md
|
2019-02-16 03:24:38 +05:30
|
|
|
|
#if __INTEL_COMPILER >= 1800
|
2019-03-13 10:46:31 +05:30
|
|
|
|
write(6,'(/,a)') ' Compiled with: '//compiler_version()
|
|
|
|
|
write(6,'(a)') ' Compiler options: '//compiler_options()
|
2019-02-16 03:24:38 +05:30
|
|
|
|
#else
|
2019-03-09 15:19:56 +05:30
|
|
|
|
write(6,'(/,a,i4.4,a,i8.8)') ' Compiled with Intel fortran version :', __INTEL_COMPILER,&
|
|
|
|
|
', build date :', __INTEL_COMPILER_BUILD_DATE
|
2019-02-16 03:24:38 +05:30
|
|
|
|
#endif
|
|
|
|
|
|
2019-03-09 15:19:56 +05:30
|
|
|
|
write(6,'(/,a)') ' Compiled on: '//__DATE__//' at '//__TIME__
|
2019-02-16 03:24:38 +05:30
|
|
|
|
|
2019-03-09 15:19:56 +05:30
|
|
|
|
call date_and_time(values = dateAndTime)
|
|
|
|
|
write(6,'(/,a,2(i2.2,a),i4.4)') ' Date: ',dateAndTime(3),'/',dateAndTime(2),'/', dateAndTime(1)
|
|
|
|
|
write(6,'(a,2(i2.2,a),i2.2)') ' Time: ',dateAndTime(5),':', dateAndTime(6),':', dateAndTime(7)
|
2019-02-16 03:24:38 +05:30
|
|
|
|
|
2019-03-09 15:19:56 +05:30
|
|
|
|
inquire(5, name=wd)
|
2018-07-10 11:54:45 +05:30
|
|
|
|
wd = wd(1:scan(wd,'/',back=.true.))
|
|
|
|
|
ierr = CHDIR(wd)
|
2018-07-10 13:23:20 +05:30
|
|
|
|
if (ierr /= 0) then
|
|
|
|
|
write(6,'(a20,a,a16)') ' working directory "',trim(wd),'" does not exist'
|
|
|
|
|
call quit(1)
|
|
|
|
|
endif
|
2012-03-09 01:55:28 +05:30
|
|
|
|
|
|
|
|
|
end subroutine DAMASK_interface_init
|
|
|
|
|
|
2009-08-31 20:39:15 +05:30
|
|
|
|
|
2013-03-01 17:18:29 +05:30
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
|
|
|
|
!> @brief solver job name (no extension) as combination of geometry and load case name
|
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
2010-06-08 15:05:13 +05:30
|
|
|
|
function getSolverJobName()
|
2019-05-15 02:14:38 +05:30
|
|
|
|
use prec
|
2010-05-10 20:32:59 +05:30
|
|
|
|
|
2013-03-01 17:18:29 +05:30
|
|
|
|
implicit none
|
2012-06-13 15:28:06 +05:30
|
|
|
|
character(1024) :: getSolverJobName, inputName
|
2013-04-09 15:38:00 +05:30
|
|
|
|
character(len=*), parameter :: pathSep = achar(47)//achar(92) ! forward and backward slash
|
2019-05-15 02:14:38 +05:30
|
|
|
|
integer :: extPos
|
2010-05-10 20:32:59 +05:30
|
|
|
|
|
2010-05-11 12:27:15 +05:30
|
|
|
|
getSolverJobName=''
|
2012-06-13 15:28:06 +05:30
|
|
|
|
inputName=''
|
2013-04-09 15:38:00 +05:30
|
|
|
|
inquire(5, name=inputName) ! determine inputfile
|
2012-06-13 15:28:06 +05:30
|
|
|
|
extPos = len_trim(inputName)-4
|
|
|
|
|
getSolverJobName=inputName(scan(inputName,pathSep,back=.true.)+1:extPos)
|
2010-05-10 20:32:59 +05:30
|
|
|
|
|
2012-03-09 01:55:28 +05:30
|
|
|
|
end function getSolverJobName
|
|
|
|
|
|
2013-03-01 17:18:29 +05:30
|
|
|
|
|
2012-03-09 01:55:28 +05:30
|
|
|
|
end module DAMASK_interface
|
2009-08-31 20:51:15 +05:30
|
|
|
|
|
2018-07-10 11:54:45 +05:30
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
2014-12-08 22:06:22 +05:30
|
|
|
|
#include "commercialFEM_fileList.f90"
|
2009-03-04 17:18:54 +05:30
|
|
|
|
|
2013-03-01 17:18:29 +05:30
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
|
|
|
|
!> @brief This is the MSC.Marc user subroutine for defining material behavior
|
|
|
|
|
!> @details (1) F,R,U are only available for continuum and membrane elements (not for
|
|
|
|
|
!> @details shells and beams).
|
|
|
|
|
!> @details
|
2013-04-09 15:38:00 +05:30
|
|
|
|
!> @details (2) Use the -> 'Plasticity,3' card(=update+finite+large disp+constant d)
|
|
|
|
|
!> @details in the parameter section of input deck (updated Lagrangian formulation).
|
2013-03-01 17:18:29 +05:30
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
2013-04-09 15:38:00 +05:30
|
|
|
|
subroutine hypela2(d,g,e,de,s,t,dt,ngens,m,nn,kcus,matus,ndi,nshear,disp, &
|
|
|
|
|
dispt,coord,ffn,frotn,strechn,eigvn,ffn1,frotn1, &
|
|
|
|
|
strechn1,eigvn1,ncrd,itel,ndeg,ndm,nnode, &
|
|
|
|
|
jtype,lclass,ifr,ifu)
|
2019-05-15 02:14:38 +05:30
|
|
|
|
use prec
|
2013-04-09 15:38:00 +05:30
|
|
|
|
use numerics, only: &
|
|
|
|
|
!$ DAMASK_NumThreadsInt, &
|
2013-08-02 16:50:11 +05:30
|
|
|
|
numerics_unitlength, &
|
|
|
|
|
usePingPong
|
2013-04-09 15:38:00 +05:30
|
|
|
|
use FEsolving, only: &
|
2016-01-18 22:22:18 +05:30
|
|
|
|
calcMode, &
|
|
|
|
|
terminallyIll, &
|
2016-01-17 18:59:42 +05:30
|
|
|
|
symmetricSolver
|
2013-04-09 15:38:00 +05:30
|
|
|
|
use debug, only: &
|
|
|
|
|
debug_level, &
|
|
|
|
|
debug_LEVELBASIC, &
|
|
|
|
|
debug_MARC, &
|
|
|
|
|
debug_info, &
|
|
|
|
|
debug_reset
|
|
|
|
|
use mesh, only: &
|
2019-02-03 21:10:15 +05:30
|
|
|
|
theMesh, &
|
2013-04-09 15:38:00 +05:30
|
|
|
|
mesh_FEasCP, &
|
|
|
|
|
mesh_element, &
|
|
|
|
|
mesh_node0, &
|
|
|
|
|
mesh_node, &
|
2013-04-22 00:18:59 +05:30
|
|
|
|
mesh_cellnode, &
|
|
|
|
|
mesh_build_cellnodes, &
|
2019-02-03 21:10:15 +05:30
|
|
|
|
mesh_build_ipCoordinates
|
2013-03-01 17:18:29 +05:30
|
|
|
|
use CPFEM, only: &
|
|
|
|
|
CPFEM_general, &
|
|
|
|
|
CPFEM_init_done, &
|
|
|
|
|
CPFEM_initAll, &
|
|
|
|
|
CPFEM_CALCRESULTS, &
|
|
|
|
|
CPFEM_AGERESULTS, &
|
|
|
|
|
CPFEM_COLLECT, &
|
|
|
|
|
CPFEM_RESTOREJACOBIAN, &
|
2016-01-17 18:59:42 +05:30
|
|
|
|
CPFEM_BACKUPJACOBIAN, &
|
|
|
|
|
cycleCounter, &
|
|
|
|
|
theInc, &
|
|
|
|
|
theTime, &
|
|
|
|
|
theDelta, &
|
|
|
|
|
lastIncConverged, &
|
|
|
|
|
outdatedByNewInc, &
|
|
|
|
|
outdatedFFN1, &
|
|
|
|
|
lastLovl
|
2009-05-07 21:57:36 +05:30
|
|
|
|
|
2013-04-09 15:38:00 +05:30
|
|
|
|
implicit none
|
|
|
|
|
!$ include "omp_lib.h" ! the openMP function library
|
2019-05-15 02:14:38 +05:30
|
|
|
|
integer, intent(in) :: & ! according to MSC.Marc 2012 Manual D
|
2013-04-09 15:38:00 +05:30
|
|
|
|
ngens, & !< size of stress-strain law
|
2016-07-20 12:14:12 +05:30
|
|
|
|
nn, & !< integration point number
|
2013-04-09 15:38:00 +05:30
|
|
|
|
ndi, & !< number of direct components
|
|
|
|
|
nshear, & !< number of shear components
|
|
|
|
|
ncrd, & !< number of coordinates
|
|
|
|
|
itel, & !< dimension of F and R, either 2 or 3
|
|
|
|
|
ndeg, & !< number of degrees of freedom
|
|
|
|
|
ndm, & !< not specified in MSC.Marc 2012 Manual D
|
|
|
|
|
nnode, & !< number of nodes per element
|
|
|
|
|
jtype, & !< element type
|
|
|
|
|
ifr, & !< set to 1 if R has been calculated
|
|
|
|
|
ifu !< set to 1 if stretch has been calculated
|
2019-05-15 02:14:38 +05:30
|
|
|
|
integer, dimension(2), intent(in) :: & ! according to MSC.Marc 2012 Manual D
|
2013-04-09 15:38:00 +05:30
|
|
|
|
m, & !< (1) user element number, (2) internal element number
|
|
|
|
|
matus, & !< (1) user material identification number, (2) internal material identification number
|
2016-07-20 12:14:12 +05:30
|
|
|
|
kcus, & !< (1) layer number, (2) internal layer number
|
2013-04-09 15:38:00 +05:30
|
|
|
|
lclass !< (1) element class, (2) 0: displacement, 1: low order Herrmann, 2: high order Herrmann
|
|
|
|
|
real(pReal), dimension(*), intent(in) :: & ! has dimension(1) according to MSC.Marc 2012 Manual D, but according to example hypela2.f dimension(*)
|
|
|
|
|
e, & !< total elastic strain
|
|
|
|
|
de, & !< increment of strain
|
|
|
|
|
dt !< increment of state variables
|
|
|
|
|
real(pReal), dimension(itel), intent(in) :: & ! according to MSC.Marc 2012 Manual D
|
|
|
|
|
strechn, & !< square of principal stretch ratios, lambda(i) at t=n
|
|
|
|
|
strechn1 !< square of principal stretch ratios, lambda(i) at t=n+1
|
|
|
|
|
real(pReal), dimension(3,3), intent(in) :: & ! has dimension(itel,*) according to MSC.Marc 2012 Manual D, but we alway assume dimension(3,3)
|
|
|
|
|
ffn, & !< deformation gradient at t=n
|
|
|
|
|
ffn1 !< deformation gradient at t=n+1
|
|
|
|
|
real(pReal), dimension(itel,*), intent(in) :: & ! according to MSC.Marc 2012 Manual D
|
|
|
|
|
frotn, & !< rotation tensor at t=n
|
|
|
|
|
eigvn, & !< i principal direction components for j eigenvalues at t=n
|
|
|
|
|
frotn1, & !< rotation tensor at t=n+1
|
|
|
|
|
eigvn1 !< i principal direction components for j eigenvalues at t=n+1
|
|
|
|
|
real(pReal), dimension(ndeg,*), intent(in) :: & ! according to MSC.Marc 2012 Manual D
|
|
|
|
|
disp, & !< incremental displacements
|
|
|
|
|
dispt !< displacements at t=n (at assembly, lovl=4) and displacements at t=n+1 (at stress recovery, lovl=6)
|
|
|
|
|
real(pReal), dimension(ncrd,*), intent(in) :: & ! according to MSC.Marc 2012 Manual D
|
|
|
|
|
coord !< coordinates
|
|
|
|
|
real(pReal), dimension(*), intent(inout) :: & ! according to MSC.Marc 2012 Manual D
|
|
|
|
|
t !< state variables (comes in at t=n, must be updated to have state variables at t=n+1)
|
|
|
|
|
real(pReal), dimension(ndi+nshear), intent(out) :: & ! has dimension(*) according to MSC.Marc 2012 Manual D, but we need to loop over it
|
|
|
|
|
s, & !< stress - should be updated by user
|
|
|
|
|
g !< change in stress due to temperature effects
|
|
|
|
|
real(pReal), dimension(ngens,ngens), intent(out) :: & ! according to MSC.Marc 2012 Manual D, but according to example hypela2.f dimension(ngens,*)
|
|
|
|
|
d !< stress-strain law to be formed
|
2008-03-15 03:02:57 +05:30
|
|
|
|
|
2013-04-09 15:38:00 +05:30
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
2009-03-04 17:18:54 +05:30
|
|
|
|
! Marc common blocks are in fixed format so they have to be reformated to free format (f90)
|
|
|
|
|
! Beware of changes in newer Marc versions
|
2013-04-22 20:11:33 +05:30
|
|
|
|
|
2018-07-10 21:55:42 +05:30
|
|
|
|
#include QUOTE(PASTE(./MarcInclude/concom,Marc4DAMASK)) ! concom is needed for inc, lovl
|
|
|
|
|
#include QUOTE(PASTE(./MarcInclude/creeps,Marc4DAMASK)) ! creeps is needed for timinc (time increment)
|
2009-03-04 17:18:54 +05:30
|
|
|
|
|
2013-04-09 15:38:00 +05:30
|
|
|
|
logical :: cutBack
|
2010-02-18 15:53:02 +05:30
|
|
|
|
real(pReal), dimension(6) :: stress
|
|
|
|
|
real(pReal), dimension(6,6) :: ddsdde
|
2019-05-15 02:14:38 +05:30
|
|
|
|
integer :: computationMode, i, cp_en, node, CPnodeID
|
2016-12-23 18:50:29 +05:30
|
|
|
|
!$ integer(4) :: defaultNumThreadsInt !< default value set by Marc
|
2013-04-09 15:38:00 +05:30
|
|
|
|
|
2019-05-15 02:14:38 +05:30
|
|
|
|
if (iand(debug_level(debug_MARC),debug_LEVELBASIC) /= 0) then
|
2013-04-09 15:38:00 +05:30
|
|
|
|
write(6,'(a,/,i8,i8,i2)') ' MSC.MARC information on shape of element(2), IP:', m, nn
|
2017-02-08 15:16:39 +05:30
|
|
|
|
write(6,'(a,2(i1))') ' Jacobian: ', ngens,ngens
|
|
|
|
|
write(6,'(a,i1)') ' Direct stress: ', ndi
|
|
|
|
|
write(6,'(a,i1)') ' Shear stress: ', nshear
|
2016-10-28 12:46:20 +05:30
|
|
|
|
write(6,'(a,i2)') ' DoF: ', ndeg
|
|
|
|
|
write(6,'(a,i2)') ' Coordinates: ', ncrd
|
2017-02-08 15:16:39 +05:30
|
|
|
|
write(6,'(a,i12)') ' Nodes: ', nnode
|
|
|
|
|
write(6,'(a,i1)') ' Deformation gradient: ', itel
|
2013-04-09 15:38:00 +05:30
|
|
|
|
write(6,'(/,a,/,3(3(f12.7,1x)/))',advance='no') ' Deformation gradient at t=n:', &
|
2019-01-14 17:15:07 +05:30
|
|
|
|
transpose(ffn)
|
2013-04-09 15:38:00 +05:30
|
|
|
|
write(6,'(/,a,/,3(3(f12.7,1x)/))',advance='no') ' Deformation gradient at t=n+1:', &
|
2019-01-14 17:15:07 +05:30
|
|
|
|
transpose(ffn1)
|
2013-04-09 15:38:00 +05:30
|
|
|
|
endif
|
2013-04-23 20:12:22 +05:30
|
|
|
|
|
|
|
|
|
!$ defaultNumThreadsInt = omp_get_num_threads() ! remember number of threads set by Marc
|
|
|
|
|
|
2015-07-24 20:27:29 +05:30
|
|
|
|
if (.not. CPFEM_init_done) call CPFEM_initAll(m(1),nn)
|
2009-10-12 21:31:49 +05:30
|
|
|
|
|
2013-04-09 15:38:00 +05:30
|
|
|
|
!$ call omp_set_num_threads(DAMASK_NumThreadsInt) ! set number of threads for parallel execution set by DAMASK_NUM_THREADS
|
2010-12-02 16:34:29 +05:30
|
|
|
|
|
2019-05-15 02:14:38 +05:30
|
|
|
|
computationMode = 0 ! save initialization value, since it does not result in any calculation
|
2013-08-02 16:50:11 +05:30
|
|
|
|
if (lovl == 4 ) then ! jacobian requested by marc
|
plain mode (no ping pong) now seems to work for marc, further testing needed
regular sequence of computation modes is
inc 0: 1,1,1,…
inc 1: 0,0,0,…
7,1,1,…
0,0,0,…
1,1,1,…
and so on
after a cutback the computation modes follow as
inc 5: 8,0,0,…
1,1,1,…
0,0,0,…
1,1,1,…
2013-08-02 21:49:45 +05:30
|
|
|
|
if (timinc < theDelta .and. theInc == inc .and. lastLovl /= lovl) & ! first after cutback
|
|
|
|
|
computationMode = CPFEM_RESTOREJACOBIAN
|
2013-08-02 18:58:50 +05:30
|
|
|
|
elseif (lovl == 6) then ! stress requested by marc
|
2013-04-09 15:38:00 +05:30
|
|
|
|
cp_en = mesh_FEasCP('elem',m(1))
|
|
|
|
|
if (cptim > theTime .or. inc /= theInc) then ! reached "convergence"
|
2009-08-11 22:01:57 +05:30
|
|
|
|
terminallyIll = .false.
|
2013-04-09 15:38:00 +05:30
|
|
|
|
cycleCounter = -1 ! first calc step increments this to cycle = 0
|
|
|
|
|
if (inc == 0) then ! >> start of analysis <<
|
|
|
|
|
lastIncConverged = .false. ! no Jacobian backup
|
|
|
|
|
outdatedByNewInc = .false. ! no aging of state
|
|
|
|
|
calcMode = .false. ! pretend last step was collection
|
2013-08-02 18:58:50 +05:30
|
|
|
|
lastLovl = lovl ! pretend that this is NOT the first after a lovl change
|
2019-05-05 15:36:55 +05:30
|
|
|
|
write(6,'(a,i6,1x,i2)') '<< HYPELA2 >> start of analysis..! ',m(1),nn
|
|
|
|
|
flush(6)
|
2013-04-09 15:38:00 +05:30
|
|
|
|
else if (inc - theInc > 1) then ! >> restart of broken analysis <<
|
|
|
|
|
lastIncConverged = .false. ! no Jacobian backup
|
|
|
|
|
outdatedByNewInc = .false. ! no aging of state
|
|
|
|
|
calcMode = .true. ! pretend last step was calculation
|
2019-05-05 15:36:55 +05:30
|
|
|
|
write(6,'(a,i6,1x,i2)') '<< HYPELA2 >> restart of analysis..! ',m(1),nn
|
|
|
|
|
flush(6)
|
2013-04-09 15:38:00 +05:30
|
|
|
|
else ! >> just the next inc <<
|
|
|
|
|
lastIncConverged = .true. ! request Jacobian backup
|
|
|
|
|
outdatedByNewInc = .true. ! request aging of state
|
|
|
|
|
calcMode = .true. ! assure last step was calculation
|
2019-05-05 15:36:55 +05:30
|
|
|
|
write(6,'(a,i6,1x,i2)') '<< HYPELA2 >> new increment..! ',m(1),nn
|
|
|
|
|
flush(6)
|
2010-11-03 20:09:18 +05:30
|
|
|
|
endif
|
2013-04-09 15:38:00 +05:30
|
|
|
|
else if ( timinc < theDelta ) then ! >> cutBack <<
|
plain mode (no ping pong) now seems to work for marc, further testing needed
regular sequence of computation modes is
inc 0: 1,1,1,…
inc 1: 0,0,0,…
7,1,1,…
0,0,0,…
1,1,1,…
and so on
after a cutback the computation modes follow as
inc 5: 8,0,0,…
1,1,1,…
0,0,0,…
1,1,1,…
2013-08-02 21:49:45 +05:30
|
|
|
|
lastIncConverged = .false. ! no Jacobian backup
|
|
|
|
|
outdatedByNewInc = .false. ! no aging of state
|
2009-10-12 21:31:49 +05:30
|
|
|
|
terminallyIll = .false.
|
2013-04-09 15:38:00 +05:30
|
|
|
|
cycleCounter = -1 ! first calc step increments this to cycle = 0
|
|
|
|
|
calcMode = .true. ! pretend last step was calculation
|
2019-05-05 15:36:55 +05:30
|
|
|
|
write(6,'(a,i6,1x,i2)') '<< HYPELA2 >> cutback detected..! ',m(1),nn
|
|
|
|
|
flush(6)
|
2013-04-09 15:38:00 +05:30
|
|
|
|
endif ! convergence treatment end
|
2009-10-12 21:31:49 +05:30
|
|
|
|
|
2016-07-20 12:14:12 +05:30
|
|
|
|
|
2013-08-02 18:58:50 +05:30
|
|
|
|
if (usePingPong) then
|
|
|
|
|
calcMode(nn,cp_en) = .not. calcMode(nn,cp_en) ! ping pong (calc <--> collect)
|
|
|
|
|
if (calcMode(nn,cp_en)) then ! now --- CALC ---
|
plain mode (no ping pong) now seems to work for marc, further testing needed
regular sequence of computation modes is
inc 0: 1,1,1,…
inc 1: 0,0,0,…
7,1,1,…
0,0,0,…
1,1,1,…
and so on
after a cutback the computation modes follow as
inc 5: 8,0,0,…
1,1,1,…
0,0,0,…
1,1,1,…
2013-08-02 21:49:45 +05:30
|
|
|
|
computationMode = CPFEM_CALCRESULTS
|
2013-08-02 18:58:50 +05:30
|
|
|
|
if (lastLovl /= lovl) then ! first after ping pong
|
|
|
|
|
call debug_reset() ! resets debugging
|
|
|
|
|
outdatedFFN1 = .false.
|
2019-05-15 02:14:38 +05:30
|
|
|
|
cycleCounter = cycleCounter + 1
|
2019-05-19 02:40:40 +05:30
|
|
|
|
mesh_cellnode = mesh_build_cellnodes() ! update cell node coordinates
|
2013-08-02 18:58:50 +05:30
|
|
|
|
call mesh_build_ipCoordinates() ! update ip coordinates
|
|
|
|
|
endif
|
|
|
|
|
if (outdatedByNewInc) then
|
2013-10-14 20:05:41 +05:30
|
|
|
|
computationMode = ior(computationMode,CPFEM_AGERESULTS) ! calc and age results
|
2013-08-02 18:58:50 +05:30
|
|
|
|
outdatedByNewInc = .false. ! reset flag
|
|
|
|
|
endif
|
|
|
|
|
else ! now --- COLLECT ---
|
plain mode (no ping pong) now seems to work for marc, further testing needed
regular sequence of computation modes is
inc 0: 1,1,1,…
inc 1: 0,0,0,…
7,1,1,…
0,0,0,…
1,1,1,…
and so on
after a cutback the computation modes follow as
inc 5: 8,0,0,…
1,1,1,…
0,0,0,…
1,1,1,…
2013-08-02 21:49:45 +05:30
|
|
|
|
computationMode = CPFEM_COLLECT ! plain collect
|
2013-08-02 18:58:50 +05:30
|
|
|
|
if (lastLovl /= lovl .and. & .not. terminallyIll) &
|
|
|
|
|
call debug_info() ! first after ping pong reports (meaningful) debugging
|
|
|
|
|
if (lastIncConverged) then
|
plain mode (no ping pong) now seems to work for marc, further testing needed
regular sequence of computation modes is
inc 0: 1,1,1,…
inc 1: 0,0,0,…
7,1,1,…
0,0,0,…
1,1,1,…
and so on
after a cutback the computation modes follow as
inc 5: 8,0,0,…
1,1,1,…
0,0,0,…
1,1,1,…
2013-08-02 21:49:45 +05:30
|
|
|
|
computationMode = ior(computationMode,CPFEM_BACKUPJACOBIAN) ! collect and backup Jacobian after convergence
|
2013-08-02 18:58:50 +05:30
|
|
|
|
lastIncConverged = .false. ! reset flag
|
|
|
|
|
endif
|
2019-02-03 21:10:15 +05:30
|
|
|
|
do node = 1,theMesh%elem%nNodes
|
2019-05-15 02:14:38 +05:30
|
|
|
|
CPnodeID = mesh_element(4+node,cp_en)
|
2014-12-05 13:05:28 +05:30
|
|
|
|
mesh_node(1:ndeg,CPnodeID) = mesh_node0(1:ndeg,CPnodeID) + numerics_unitlength * dispt(1:ndeg,node)
|
2013-08-02 18:58:50 +05:30
|
|
|
|
enddo
|
2009-10-12 21:31:49 +05:30
|
|
|
|
endif
|
2016-07-20 12:14:12 +05:30
|
|
|
|
|
plain mode (no ping pong) now seems to work for marc, further testing needed
regular sequence of computation modes is
inc 0: 1,1,1,…
inc 1: 0,0,0,…
7,1,1,…
0,0,0,…
1,1,1,…
and so on
after a cutback the computation modes follow as
inc 5: 8,0,0,…
1,1,1,…
0,0,0,…
1,1,1,…
2013-08-02 21:49:45 +05:30
|
|
|
|
else ! --- PLAIN MODE ---
|
|
|
|
|
computationMode = CPFEM_CALCRESULTS ! always calc
|
|
|
|
|
if (lastLovl /= lovl) then
|
|
|
|
|
if (.not. terminallyIll) &
|
|
|
|
|
call debug_info() ! first reports (meaningful) debugging
|
|
|
|
|
call debug_reset() ! and resets debugging
|
|
|
|
|
outdatedFFN1 = .false.
|
2019-05-15 02:14:38 +05:30
|
|
|
|
cycleCounter = cycleCounter + 1
|
2019-05-19 02:40:40 +05:30
|
|
|
|
mesh_cellnode = mesh_build_cellnodes() ! update cell node coordinates
|
plain mode (no ping pong) now seems to work for marc, further testing needed
regular sequence of computation modes is
inc 0: 1,1,1,…
inc 1: 0,0,0,…
7,1,1,…
0,0,0,…
1,1,1,…
and so on
after a cutback the computation modes follow as
inc 5: 8,0,0,…
1,1,1,…
0,0,0,…
1,1,1,…
2013-08-02 21:49:45 +05:30
|
|
|
|
call mesh_build_ipCoordinates() ! update ip coordinates
|
|
|
|
|
endif
|
|
|
|
|
if (outdatedByNewInc) then
|
|
|
|
|
computationMode = ior(computationMode,CPFEM_AGERESULTS)
|
|
|
|
|
outdatedByNewInc = .false. ! reset flag
|
|
|
|
|
endif
|
|
|
|
|
if (lastIncConverged) then
|
|
|
|
|
computationMode = ior(computationMode,CPFEM_BACKUPJACOBIAN) ! backup Jacobian after convergence
|
|
|
|
|
lastIncConverged = .false. ! reset flag
|
|
|
|
|
endif
|
2008-07-14 20:08:19 +05:30
|
|
|
|
endif
|
2008-03-15 03:02:57 +05:30
|
|
|
|
|
2013-04-09 15:38:00 +05:30
|
|
|
|
theTime = cptim ! record current starting time
|
|
|
|
|
theDelta = timinc ! record current time increment
|
|
|
|
|
theInc = inc ! record current increment number
|
2013-08-02 18:58:50 +05:30
|
|
|
|
|
2009-10-12 21:31:49 +05:30
|
|
|
|
endif
|
2013-08-02 21:14:28 +05:30
|
|
|
|
lastLovl = lovl ! record lovl
|
2008-02-19 00:19:06 +05:30
|
|
|
|
|
2013-08-02 16:50:11 +05:30
|
|
|
|
call CPFEM_general(computationMode,usePingPong,ffn,ffn1,t(1),timinc,m(1),nn,stress,ddsdde)
|
2008-02-19 00:19:06 +05:30
|
|
|
|
! Mandel: 11, 22, 33, SQRT(2)*12, SQRT(2)*23, SQRT(2)*13
|
|
|
|
|
! Marc: 11, 22, 33, 12, 23, 13
|
2010-02-18 15:53:02 +05:30
|
|
|
|
! Marc: 11, 22, 33, 12
|
|
|
|
|
|
2019-01-14 17:15:07 +05:30
|
|
|
|
d = ddsdde(1:ngens,1:ngens)
|
|
|
|
|
s = stress(1:ndi+nshear)
|
2013-04-09 15:38:00 +05:30
|
|
|
|
g = 0.0_pReal
|
|
|
|
|
if(symmetricSolver) d = 0.5_pReal*(d+transpose(d))
|
2016-07-20 12:14:12 +05:30
|
|
|
|
|
2013-04-09 15:38:00 +05:30
|
|
|
|
!$ call omp_set_num_threads(defaultNumThreadsInt) ! reset number of threads to stored default value
|
2010-11-19 23:15:27 +05:30
|
|
|
|
|
2012-03-09 01:55:28 +05:30
|
|
|
|
end subroutine hypela2
|
2009-05-07 21:57:36 +05:30
|
|
|
|
|
2008-04-07 20:24:29 +05:30
|
|
|
|
|
2016-05-03 20:36:55 +05:30
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
2017-02-08 14:32:56 +05:30
|
|
|
|
!> @brief calculate internal heat generated due to inelastic energy dissipation
|
2016-05-03 20:36:55 +05:30
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
|
|
|
|
subroutine flux(f,ts,n,time)
|
2019-05-15 02:14:38 +05:30
|
|
|
|
use prec
|
2016-07-20 12:14:12 +05:30
|
|
|
|
use thermal_conduction, only: &
|
|
|
|
|
thermal_conduction_getSourceAndItsTangent
|
2016-05-03 20:36:55 +05:30
|
|
|
|
use mesh, only: &
|
|
|
|
|
mesh_FEasCP
|
2016-07-20 12:14:12 +05:30
|
|
|
|
|
2016-05-03 20:36:55 +05:30
|
|
|
|
implicit none
|
2019-05-15 02:14:38 +05:30
|
|
|
|
real(pReal), dimension(6), intent(in) :: &
|
2016-05-03 20:36:55 +05:30
|
|
|
|
ts
|
2019-05-15 02:14:38 +05:30
|
|
|
|
integer, dimension(10), intent(in) :: &
|
2016-05-03 20:36:55 +05:30
|
|
|
|
n
|
2019-05-15 02:14:38 +05:30
|
|
|
|
real(pReal), intent(in) :: &
|
2016-05-03 20:36:55 +05:30
|
|
|
|
time
|
2019-05-15 02:14:38 +05:30
|
|
|
|
real(pReal), dimension(2), intent(out) :: &
|
2016-05-03 20:36:55 +05:30
|
|
|
|
f
|
2016-07-20 12:14:12 +05:30
|
|
|
|
|
|
|
|
|
call thermal_conduction_getSourceAndItsTangent(f(1), f(2), ts(3), n(3),mesh_FEasCP('elem',n(1)))
|
2017-02-08 14:32:56 +05:30
|
|
|
|
|
|
|
|
|
end subroutine flux
|
2016-05-03 20:36:55 +05:30
|
|
|
|
|
|
|
|
|
|
2019-05-05 15:36:55 +05:30
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
|
|
|
|
!> @brief sets user defined output variables for Marc
|
|
|
|
|
!> @details select a variable contour plotting (user subroutine).
|
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
|
|
|
|
subroutine uedinc(inc,incsub)
|
2019-05-15 02:14:38 +05:30
|
|
|
|
use prec
|
2019-05-05 15:36:55 +05:30
|
|
|
|
use CPFEM, only: &
|
|
|
|
|
CPFEM_results
|
|
|
|
|
|
|
|
|
|
implicit none
|
|
|
|
|
integer, intent(in) :: inc, incsub
|
|
|
|
|
#include QUOTE(PASTE(./MarcInclude/creeps,Marc4DAMASK)) ! creeps is needed for timinc (time increment)
|
|
|
|
|
|
|
|
|
|
call CPFEM_results(inc,cptim)
|
|
|
|
|
|
|
|
|
|
end subroutine uedinc
|
|
|
|
|
|
|
|
|
|
|
2013-03-01 17:18:29 +05:30
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
|
|
|
|
!> @brief sets user defined output variables for Marc
|
|
|
|
|
!> @details select a variable contour plotting (user subroutine).
|
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
2013-04-09 15:38:00 +05:30
|
|
|
|
subroutine plotv(v,s,sp,etot,eplas,ecreep,t,m,nn,layer,ndi,nshear,jpltcd)
|
2019-05-15 02:14:38 +05:30
|
|
|
|
use prec
|
2013-04-09 15:38:00 +05:30
|
|
|
|
use mesh, only: &
|
|
|
|
|
mesh_FEasCP
|
|
|
|
|
use IO, only: &
|
|
|
|
|
IO_error
|
|
|
|
|
use homogenization, only: &
|
|
|
|
|
materialpoint_results,&
|
|
|
|
|
materialpoint_sizeResults
|
2016-07-20 12:14:12 +05:30
|
|
|
|
|
2007-03-22 17:39:37 +05:30
|
|
|
|
implicit none
|
2019-05-15 02:14:38 +05:30
|
|
|
|
integer, intent(in) :: &
|
2013-04-09 15:38:00 +05:30
|
|
|
|
m, & !< element number
|
|
|
|
|
nn, & !< integration point number
|
|
|
|
|
layer, & !< layer number
|
|
|
|
|
ndi, & !< number of direct stress components
|
|
|
|
|
nshear, & !< number of shear stress components
|
|
|
|
|
jpltcd !< user variable index
|
|
|
|
|
real(pReal), dimension(*), intent(in) :: &
|
|
|
|
|
s, & !< stress array
|
|
|
|
|
sp, & !< stresses in preferred direction
|
2016-07-20 12:14:12 +05:30
|
|
|
|
etot, & !< total strain (generalized)
|
2013-04-09 15:38:00 +05:30
|
|
|
|
eplas, & !< total plastic strain
|
|
|
|
|
ecreep, & !< total creep strain
|
|
|
|
|
t !< current temperature
|
|
|
|
|
real(pReal), intent(out) :: &
|
|
|
|
|
v !< variable
|
2009-05-07 21:57:36 +05:30
|
|
|
|
|
2019-05-15 02:14:38 +05:30
|
|
|
|
if (jpltcd > materialpoint_sizeResults) call IO_error(700,jpltcd) ! complain about out of bounds error
|
2009-05-07 21:57:36 +05:30
|
|
|
|
v = materialpoint_results(jpltcd,nn,mesh_FEasCP('elem', m))
|
|
|
|
|
|
2016-10-28 12:46:20 +05:30
|
|
|
|
end subroutine plotv
|