using default string length
This commit is contained in:
parent
1037aa98d3
commit
34af10fac1
24
src/IO.f90
24
src/IO.f90
|
@ -243,12 +243,12 @@ subroutine IO_open_inputFile(fileUnit)
|
||||||
|
|
||||||
|
|
||||||
integer, allocatable, dimension(:) :: chunkPos
|
integer, allocatable, dimension(:) :: chunkPos
|
||||||
character(len=65536) :: line,fname
|
character(len=pStringLen :: line,fname
|
||||||
logical :: createSuccess,fexist
|
logical :: createSuccess,fexist
|
||||||
|
|
||||||
|
|
||||||
do
|
do
|
||||||
read(unit2,'(A65536)',END=220) line
|
read(unit2,'(A256)',END=220) line
|
||||||
chunkPos = IO_stringPos(line)
|
chunkPos = IO_stringPos(line)
|
||||||
|
|
||||||
if (IO_lc(IO_StringValue(line,chunkPos,1))=='*include') then
|
if (IO_lc(IO_StringValue(line,chunkPos,1))=='*include') then
|
||||||
|
@ -884,7 +884,7 @@ end subroutine IO_warning
|
||||||
!--------------------------------------------------------------------------------------------------
|
!--------------------------------------------------------------------------------------------------
|
||||||
function IO_read(fileUnit) result(line)
|
function IO_read(fileUnit) result(line)
|
||||||
|
|
||||||
integer, intent(in) :: fileUnit !< file unit
|
integer, intent(in) :: fileUnit !< file unit
|
||||||
|
|
||||||
character(len=pStringLen) :: line
|
character(len=pStringLen) :: line
|
||||||
|
|
||||||
|
@ -924,7 +924,7 @@ integer function IO_countDataLines(fileUnit)
|
||||||
|
|
||||||
|
|
||||||
integer, allocatable, dimension(:) :: chunkPos
|
integer, allocatable, dimension(:) :: chunkPos
|
||||||
character(len=65536) :: line, &
|
character(len=pStringLen) :: line, &
|
||||||
tmp
|
tmp
|
||||||
|
|
||||||
IO_countDataLines = 0
|
IO_countDataLines = 0
|
||||||
|
@ -956,7 +956,7 @@ integer function IO_countNumericalDataLines(fileUnit)
|
||||||
|
|
||||||
|
|
||||||
integer, allocatable, dimension(:) :: chunkPos
|
integer, allocatable, dimension(:) :: chunkPos
|
||||||
character(len=65536) :: line, &
|
character(len=pStringLen) :: line, &
|
||||||
tmp
|
tmp
|
||||||
|
|
||||||
IO_countNumericalDataLines = 0
|
IO_countNumericalDataLines = 0
|
||||||
|
@ -991,7 +991,7 @@ integer function IO_countContinuousIntValues(fileUnit)
|
||||||
integer :: l,c
|
integer :: l,c
|
||||||
#endif
|
#endif
|
||||||
integer, allocatable, dimension(:) :: chunkPos
|
integer, allocatable, dimension(:) :: chunkPos
|
||||||
character(len=65536) :: line
|
character(len=pString) :: line
|
||||||
|
|
||||||
IO_countContinuousIntValues = 0
|
IO_countContinuousIntValues = 0
|
||||||
line = ''
|
line = ''
|
||||||
|
@ -1048,21 +1048,21 @@ function IO_continuousIntValues(fileUnit,maxN,lookupName,lookupMap,lookupMaxN)
|
||||||
integer, intent(in) :: fileUnit, &
|
integer, intent(in) :: fileUnit, &
|
||||||
lookupMaxN
|
lookupMaxN
|
||||||
integer, dimension(:,:), intent(in) :: lookupMap
|
integer, dimension(:,:), intent(in) :: lookupMap
|
||||||
character(len=64), dimension(:), intent(in) :: lookupName
|
character(len=*), dimension(:), intent(in) :: lookupName
|
||||||
integer :: i,first,last
|
integer :: i,first,last
|
||||||
#ifdef Abaqus
|
#ifdef Abaqus
|
||||||
integer :: j,l,c
|
integer :: j,l,c
|
||||||
#endif
|
#endif
|
||||||
integer, allocatable, dimension(:) :: chunkPos
|
integer, allocatable, dimension(:) :: chunkPos
|
||||||
character(len=65536) line
|
character(len=pStringLen) :: line
|
||||||
logical rangeGeneration
|
logical :: rangeGeneration
|
||||||
|
|
||||||
IO_continuousIntValues = 0
|
IO_continuousIntValues = 0
|
||||||
rangeGeneration = .false.
|
rangeGeneration = .false.
|
||||||
|
|
||||||
#if defined(Marc4DAMASK)
|
#if defined(Marc4DAMASK)
|
||||||
do
|
do
|
||||||
read(fileUnit,'(A65536)',end=100) line
|
read(fileUnit,'(A256)',end=100) line
|
||||||
chunkPos = IO_stringPos(line)
|
chunkPos = IO_stringPos(line)
|
||||||
if (chunkPos(1) < 1) then ! empty line
|
if (chunkPos(1) < 1) then ! empty line
|
||||||
exit
|
exit
|
||||||
|
@ -1103,14 +1103,14 @@ function IO_continuousIntValues(fileUnit,maxN,lookupName,lookupMap,lookupMaxN)
|
||||||
!--------------------------------------------------------------------------------------------------
|
!--------------------------------------------------------------------------------------------------
|
||||||
! check if the element values in the elset are auto generated
|
! check if the element values in the elset are auto generated
|
||||||
backspace(fileUnit)
|
backspace(fileUnit)
|
||||||
read(fileUnit,'(A65536)',end=100) line
|
read(fileUnit,'(A256)',end=100) line
|
||||||
chunkPos = IO_stringPos(line)
|
chunkPos = IO_stringPos(line)
|
||||||
do i = 1,chunkPos(1)
|
do i = 1,chunkPos(1)
|
||||||
if (IO_lc(IO_stringValue(line,chunkPos,i)) == 'generate') rangeGeneration = .true.
|
if (IO_lc(IO_stringValue(line,chunkPos,i)) == 'generate') rangeGeneration = .true.
|
||||||
enddo
|
enddo
|
||||||
|
|
||||||
do l = 1,c
|
do l = 1,c
|
||||||
read(fileUnit,'(A65536)',end=100) line
|
read(fileUnit,'(A256)',end=100) line
|
||||||
chunkPos = IO_stringPos(line)
|
chunkPos = IO_stringPos(line)
|
||||||
if (verify(IO_stringValue(line,chunkPos,1),'0123456789') > 0) then ! a non-int, i.e. set names follow on this line
|
if (verify(IO_stringValue(line,chunkPos,1),'0123456789') > 0) then ! a non-int, i.e. set names follow on this line
|
||||||
do i = 1,chunkPos(1) ! loop over set names in line
|
do i = 1,chunkPos(1) ! loop over set names in line
|
||||||
|
|
|
@ -77,7 +77,7 @@ module crystallite
|
||||||
crystallite_localPlasticity !< indicates this grain to have purely local constitutive law
|
crystallite_localPlasticity !< indicates this grain to have purely local constitutive law
|
||||||
|
|
||||||
type :: tOutput !< new requested output (per phase)
|
type :: tOutput !< new requested output (per phase)
|
||||||
character(len=65536), allocatable, dimension(:) :: &
|
character(len=pStringLen), allocatable, dimension(:) :: &
|
||||||
label
|
label
|
||||||
end type tOutput
|
end type tOutput
|
||||||
type(tOutput), allocatable, dimension(:) :: output_constituent
|
type(tOutput), allocatable, dimension(:) :: output_constituent
|
||||||
|
|
|
@ -44,7 +44,7 @@ contains
|
||||||
subroutine damage_local_init
|
subroutine damage_local_init
|
||||||
|
|
||||||
integer :: maxNinstance,o,NofMyHomog,h
|
integer :: maxNinstance,o,NofMyHomog,h
|
||||||
character(len=65536), dimension(:), allocatable :: outputs
|
character(len=pStringLen), dimension(:), allocatable :: outputs
|
||||||
|
|
||||||
write(6,'(/,a)') ' <<<+- damage_'//DAMAGE_local_label//' init -+>>>'; flush(6)
|
write(6,'(/,a)') ' <<<+- damage_'//DAMAGE_local_label//' init -+>>>'; flush(6)
|
||||||
|
|
||||||
|
|
|
@ -49,7 +49,7 @@ contains
|
||||||
subroutine damage_nonlocal_init
|
subroutine damage_nonlocal_init
|
||||||
|
|
||||||
integer :: maxNinstance,o,NofMyHomog,h
|
integer :: maxNinstance,o,NofMyHomog,h
|
||||||
character(len=65536), dimension(:), allocatable :: outputs
|
character(len=pStringLen), dimension(:), allocatable :: outputs
|
||||||
|
|
||||||
write(6,'(/,a)') ' <<<+- damage_'//DAMAGE_nonlocal_label//' init -+>>>'; flush(6)
|
write(6,'(/,a)') ' <<<+- damage_'//DAMAGE_nonlocal_label//' init -+>>>'; flush(6)
|
||||||
|
|
||||||
|
|
|
@ -36,7 +36,7 @@ program DAMASK_spectral
|
||||||
N_t = 0, & !< # of time indicators found in load case file
|
N_t = 0, & !< # of time indicators found in load case file
|
||||||
N_n = 0, & !< # of increment specifiers found in load case file
|
N_n = 0, & !< # of increment specifiers found in load case file
|
||||||
N_def = 0 !< # of rate of deformation specifiers found in load case file
|
N_def = 0 !< # of rate of deformation specifiers found in load case file
|
||||||
character(len=65536) :: &
|
character(len=pStringLen) :: &
|
||||||
line
|
line
|
||||||
|
|
||||||
!--------------------------------------------------------------------------------------------------
|
!--------------------------------------------------------------------------------------------------
|
||||||
|
|
|
@ -77,7 +77,7 @@ module subroutine mech_RGC_init
|
||||||
integer(kind(undefined_ID)) :: &
|
integer(kind(undefined_ID)) :: &
|
||||||
outputID
|
outputID
|
||||||
|
|
||||||
character(len=65536), dimension(:), allocatable :: &
|
character(len=pStringLen), dimension(:), allocatable :: &
|
||||||
outputs
|
outputs
|
||||||
|
|
||||||
write(6,'(/,a)') ' <<<+- homogenization_'//HOMOGENIZATION_RGC_label//' init -+>>>'
|
write(6,'(/,a)') ' <<<+- homogenization_'//HOMOGENIZATION_RGC_label//' init -+>>>'
|
||||||
|
|
|
@ -33,7 +33,7 @@ module subroutine mech_isostrain_init
|
||||||
Ninstance, &
|
Ninstance, &
|
||||||
h, &
|
h, &
|
||||||
NofMyHomog
|
NofMyHomog
|
||||||
character(len=65536) :: &
|
character(len=pStringLen) :: &
|
||||||
tag = ''
|
tag = ''
|
||||||
|
|
||||||
write(6,'(/,a)') ' <<<+- homogenization_'//HOMOGENIZATION_ISOSTRAIN_label//' init -+>>>'
|
write(6,'(/,a)') ' <<<+- homogenization_'//HOMOGENIZATION_ISOSTRAIN_label//' init -+>>>'
|
||||||
|
|
|
@ -492,7 +492,7 @@ contains
|
||||||
subroutine lattice_init
|
subroutine lattice_init
|
||||||
|
|
||||||
integer :: Nphases
|
integer :: Nphases
|
||||||
character(len=65536) :: &
|
character(len=pStringLen) :: &
|
||||||
tag = ''
|
tag = ''
|
||||||
integer :: i,p
|
integer :: i,p
|
||||||
real(pReal), dimension(:), allocatable :: &
|
real(pReal), dimension(:), allocatable :: &
|
||||||
|
|
|
@ -27,7 +27,7 @@ program DAMASK_FEM
|
||||||
integer, allocatable, dimension(:) :: chunkPos ! this is longer than needed for geometry parsing
|
integer, allocatable, dimension(:) :: chunkPos ! this is longer than needed for geometry parsing
|
||||||
integer :: &
|
integer :: &
|
||||||
N_def = 0 !< # of rate of deformation specifiers found in load case file
|
N_def = 0 !< # of rate of deformation specifiers found in load case file
|
||||||
character(len=65536) :: &
|
character(len=pStringLen) :: &
|
||||||
line
|
line
|
||||||
|
|
||||||
!--------------------------------------------------------------------------------------------------
|
!--------------------------------------------------------------------------------------------------
|
||||||
|
|
|
@ -79,9 +79,9 @@ module prec
|
||||||
real(pReal), private, parameter :: PREAL_EPSILON = epsilon(0.0_pReal) !< minimum positive number such that 1.0 + EPSILON /= 1.0.
|
real(pReal), private, parameter :: PREAL_EPSILON = epsilon(0.0_pReal) !< minimum positive number such that 1.0 + EPSILON /= 1.0.
|
||||||
real(pReal), private, parameter :: PREAL_MIN = tiny(0.0_pReal) !< smallest normalized floating point number
|
real(pReal), private, parameter :: PREAL_MIN = tiny(0.0_pReal) !< smallest normalized floating point number
|
||||||
|
|
||||||
integer, dimension(0), parameter, public :: emptyIntArray = [integer::]
|
integer, dimension(0), parameter, public :: emptyIntArray = [integer::]
|
||||||
real(pReal), dimension(0), parameter, public :: emptyRealArray = [real(pReal)::]
|
real(pReal), dimension(0), parameter, public :: emptyRealArray = [real(pReal)::]
|
||||||
character(len=65536), dimension(0), parameter, public :: emptyStringArray = [character(len=65536)::]
|
character(len=pStringLen), dimension(0), parameter, public :: emptyStringArray = [character(len=pStringLen)::]
|
||||||
|
|
||||||
private :: &
|
private :: &
|
||||||
unitTest
|
unitTest
|
||||||
|
|
|
@ -74,7 +74,7 @@ subroutine source_damage_anisoBrittle_init
|
||||||
|
|
||||||
character(len=pStringLen) :: &
|
character(len=pStringLen) :: &
|
||||||
extmsg = ''
|
extmsg = ''
|
||||||
character(len=65536), dimension(:), allocatable :: &
|
character(len=pStringLen), dimension(:), allocatable :: &
|
||||||
outputs
|
outputs
|
||||||
|
|
||||||
write(6,'(/,a)') ' <<<+- source_'//SOURCE_DAMAGE_ANISOBRITTLE_LABEL//' init -+>>>'; flush(6)
|
write(6,'(/,a)') ' <<<+- source_'//SOURCE_DAMAGE_ANISOBRITTLE_LABEL//' init -+>>>'; flush(6)
|
||||||
|
|
|
@ -67,7 +67,7 @@ subroutine source_damage_anisoDuctile_init
|
||||||
|
|
||||||
character(len=pStringLen) :: &
|
character(len=pStringLen) :: &
|
||||||
extmsg = ''
|
extmsg = ''
|
||||||
character(len=65536), dimension(:), allocatable :: &
|
character(len=pStringLen), dimension(:), allocatable :: &
|
||||||
outputs
|
outputs
|
||||||
|
|
||||||
write(6,'(/,a)') ' <<<+- source_'//SOURCE_DAMAGE_ANISODUCTILE_LABEL//' init -+>>>'; flush(6)
|
write(6,'(/,a)') ' <<<+- source_'//SOURCE_DAMAGE_ANISODUCTILE_LABEL//' init -+>>>'; flush(6)
|
||||||
|
|
|
@ -61,7 +61,7 @@ subroutine source_damage_isoBrittle_init
|
||||||
|
|
||||||
character(len=pStringLen) :: &
|
character(len=pStringLen) :: &
|
||||||
extmsg = ''
|
extmsg = ''
|
||||||
character(len=65536), dimension(:), allocatable :: &
|
character(len=pStringLen), dimension(:), allocatable :: &
|
||||||
outputs
|
outputs
|
||||||
|
|
||||||
write(6,'(/,a)') ' <<<+- source_'//SOURCE_DAMAGE_ISOBRITTLE_LABEL//' init -+>>>'; flush(6)
|
write(6,'(/,a)') ' <<<+- source_'//SOURCE_DAMAGE_ISOBRITTLE_LABEL//' init -+>>>'; flush(6)
|
||||||
|
|
|
@ -58,7 +58,7 @@ subroutine source_damage_isoDuctile_init
|
||||||
|
|
||||||
character(len=pStringLen) :: &
|
character(len=pStringLen) :: &
|
||||||
extmsg = ''
|
extmsg = ''
|
||||||
character(len=65536), dimension(:), allocatable :: &
|
character(len=pStringLen), dimension(:), allocatable :: &
|
||||||
outputs
|
outputs
|
||||||
|
|
||||||
write(6,'(/,a)') ' <<<+- source_'//SOURCE_DAMAGE_ISODUCTILE_LABEL//' init -+>>>'
|
write(6,'(/,a)') ' <<<+- source_'//SOURCE_DAMAGE_ISODUCTILE_LABEL//' init -+>>>'
|
||||||
|
|
Loading…
Reference in New Issue