2011-04-07 12:50:28 +05:30
! Copyright 2011 Max-Planck-Institut für Eisenforschung GmbH
2011-04-04 19:39:54 +05:30
!
! This file is part of DAMASK,
2012-03-06 20:22:48 +05:30
! the Düsseldorf Advanced Material Simulation Kit.
2011-04-04 19:39:54 +05:30
!
! DAMASK is free software: you can redistribute it and/or modify
! it under the terms of the GNU General Public License as published by
! the Free Software Foundation, either version 3 of the License, or
! (at your option) any later version.
!
! DAMASK is distributed in the hope that it will be useful,
! but WITHOUT ANY WARRANTY; without even the implied warranty of
! MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
! GNU General Public License for more details.
!
! You should have received a copy of the GNU General Public License
! along with DAMASK. If not, see <http://www.gnu.org/licenses/>.
!
2012-03-06 20:22:48 +05:30
!--------------------------------------------------------------------------------------------------
2012-08-09 18:34:56 +05:30
! $Id$
2012-03-06 20:22:48 +05:30
!--------------------------------------------------------------------------------------------------
!> @author Martin Diehl, Max-Planck-Institut für Eisenforschung GmbH
2012-08-03 14:55:48 +05:30
!> @author Philip Eisenlohr, Max-Planck-Institut für Eisenforschung GmbH
2012-03-06 20:22:48 +05:30
!> @brief Interfacing between the spectral solver and the material subroutines provided
!! by DAMASK
!--------------------------------------------------------------------------------------------------
module DAMASK_interface
2012-06-15 21:40:21 +05:30
use prec , only : &
pInt
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
2011-11-04 01:02:11 +05:30
implicit none
2012-03-06 20:22:48 +05:30
private
2012-06-15 21:40:21 +05:30
logical , public :: &
appendToOutFile = . false . !< Append to existing spectralOut file (in case of restart, not in case of regridding)
integer ( pInt ) , public :: &
2012-06-18 14:57:36 +05:30
spectralRestartInc = 1_pInt !< Increment at which calculation starts
2012-06-15 21:40:21 +05:30
character ( len = 1024 ) , public :: &
geometryFile = '' , & !< parameter given for geometry file
loadCaseFile = '' !< parameter given for load case file
public :: getSolverWorkingDirectoryName , &
2012-03-06 20:22:48 +05:30
getSolverJobName , &
2012-04-11 22:58:08 +05:30
DAMASK_interface_init
2012-06-15 21:40:21 +05:30
private :: getGeometryFile , &
getLoadCaseFile , &
rectifyPath , &
2012-03-06 20:22:48 +05:30
makeRelativePath , &
2012-06-15 21:40:21 +05:30
getPathSep , &
IO_stringValue , &
IO_intValue , &
IO_lc , &
IO_stringPos
2012-03-06 20:22:48 +05:30
contains
!--------------------------------------------------------------------------------------------------
2012-03-09 01:55:28 +05:30
!> @brief initializes the solver by interpreting the command line arguments. Also writes
2012-06-15 21:40:21 +05:30
!! information on computation to screen
2012-03-06 20:22:48 +05:30
!--------------------------------------------------------------------------------------------------
2012-06-15 21:40:21 +05:30
subroutine DAMASK_interface_init ( loadCaseParameterIn , geometryParameterIn )
2012-03-06 20:22:48 +05:30
use , intrinsic :: iso_fortran_env ! to get compiler_version and compiler_options (at least for gfortran 4.6 at the moment)
2011-11-04 01:02:11 +05:30
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
implicit none
2012-04-11 22:58:08 +05:30
character ( len = 1024 ) , optional , intent ( in ) :: &
2012-06-15 21:40:21 +05:30
loadCaseParameterIn , &
2012-04-11 22:58:08 +05:30
geometryParameterIn
character ( len = 1024 ) :: &
commandLine , & !< command line call as string
2012-06-15 21:40:21 +05:30
geometryParameter , &
loadCaseParameter , &
2012-04-11 22:58:08 +05:30
hostName , & !< name of computer
2012-06-15 21:40:21 +05:30
userName , & !< name of user calling the executable
tag
2012-04-11 22:58:08 +05:30
integer :: &
2012-06-15 21:40:21 +05:30
i
integer , parameter :: &
maxNchunks = 7
integer , dimension ( 1 + 2 * maxNchunks ) :: &
positions
2012-04-11 22:58:08 +05:30
integer , dimension ( 8 ) :: &
dateAndTime ! type default integer
2012-06-15 21:40:21 +05:30
logical :: &
gotLoadCase = . false . , &
2012-06-18 14:57:36 +05:30
gotGeometry = . false .
2012-06-15 21:40:21 +05:30
2012-04-20 17:28:41 +05:30
write ( 6 , '(a)' ) ''
2012-08-09 18:34:56 +05:30
write ( 6 , '(a)' ) ' <<<+- DAMASK_spectral_interface init -+>>>'
write ( 6 , '(a)' ) ' $Id$'
2012-02-01 00:48:55 +05:30
#include "compilation_info.f90"
2012-06-15 21:40:21 +05:30
2012-04-11 22:58:08 +05:30
if ( present ( loadcaseParameterIn ) . and . present ( geometryParameterIn ) ) then ! both mandatory parameters given in function call
geometryParameter = geometryParameterIn
loadcaseParameter = loadcaseParameterIn
2012-06-18 14:57:36 +05:30
commandLine = 'n/a'
2012-06-15 21:40:21 +05:30
gotLoadCase = . true .
gotGeometry = . true .
else if ( . not . ( present ( loadcaseParameterIn ) . and . present ( geometryParameterIn ) ) ) then ! none parameters given in function call, trying to get them from command line
2012-04-11 22:58:08 +05:30
call get_command ( commandLine )
2012-06-15 21:40:21 +05:30
positions = IO_stringPos ( commandLine , maxNchunks )
do i = 1 , maxNchunks
tag = IO_lc ( IO_stringValue ( commandLine , positions , i ) ) ! extract key
select case ( tag )
case ( '-h' , '--help' )
2012-08-03 14:55:48 +05:30
write ( 6 , '(a)' ) ' #############################################################'
write ( 6 , '(a)' ) ' DAMASK spectral:'
write ( 6 , '(a)' ) ' The spectral method boundary value problem solver for'
write ( 6 , '(a)' ) ' the Duesseldorf Advanced Material Simulation Kit'
write ( 6 , '(a)' ) ' #############################################################'
write ( 6 , '(a)' ) ' Valid command line switches:'
write ( 6 , '(a)' ) ' --geom (-g, --geometry)'
write ( 6 , '(a)' ) ' --load (-l, --loadcase)'
write ( 6 , '(a)' ) ' --restart (-r, --rs)'
write ( 6 , '(a)' ) ' --regrid (--rg)'
write ( 6 , '(a)' ) ' --help (-h)'
write ( 6 , '(a)' ) ' '
write ( 6 , '(a)' ) ' Mandatory Arguments:'
write ( 6 , '(a)' ) ' --load PathToLoadFile/NameOfLoadFile.load'
write ( 6 , '(a)' ) ' "PathToLoadFile" will be the working directory.'
write ( 6 , '(a)' ) ' Make sure the file "material.config" exists in the working'
write ( 6 , '(a)' ) ' directory'
write ( 6 , '(a)' ) ' For further configuration place "numerics.config"'
write ( 6 , '(a)' ) ' and "numerics.config" in that directory.'
write ( 6 , '(a)' ) ' '
write ( 6 , '(a)' ) ' --geom PathToGeomFile/NameOfGeom.geom'
write ( 6 , '(a)' ) ' '
write ( 6 , '(a)' ) ' Optional Argument:'
write ( 6 , '(a)' ) ' --restart XX'
write ( 6 , '(a)' ) ' Reads in total increment No. XX-1 and continous to'
write ( 6 , '(a)' ) ' calculate total increment No. XX.'
write ( 6 , '(a)' ) ' Appends to existing results file '
write ( 6 , '(a)' ) ' "NameOfGeom_NameOfLoadFile.spectralOut".'
write ( 6 , '(a)' ) ' Works only if the restart information for total increment'
write ( 6 , '(a)' ) ' No. XX-1 is available in the working directory.'
write ( 6 , '(a)' ) ' '
write ( 6 , '(a)' ) ' --regrid XX'
write ( 6 , '(a)' ) ' Reads in total increment No. XX-1 and continous to'
write ( 6 , '(a)' ) ' calculate total increment No. XX.'
write ( 6 , '(a)' ) ' Attention: Overwrites existing results file '
write ( 6 , '(a)' ) ' "NameOfGeom_NameOfLoadFile.spectralOut".'
write ( 6 , '(a)' ) ' Works only if the restart information for total increment'
write ( 6 , '(a)' ) ' No. XX-1 is available in the working directory.'
write ( 6 , '(a)' ) ' Help:'
write ( 6 , '(a)' ) ' --help'
write ( 6 , '(a)' ) ' Prints this message and exits'
write ( 6 , '(a)' ) ' '
2012-06-15 21:40:21 +05:30
call quit ( 0_pInt ) ! normal Termination
case ( '-l' , '--load' , '--loadcase' )
loadcaseParameter = IO_stringValue ( commandLine , positions , i + 1_pInt )
gotLoadCase = . true .
case ( '-g' , '--geom' , '--geometry' )
geometryParameter = IO_stringValue ( commandLine , positions , i + 1_pInt )
gotGeometry = . true .
case ( '-r' , '--rs' , '--restart' )
2012-06-18 14:57:36 +05:30
spectralRestartInc = IO_IntValue ( commandLine , positions , i + 1_pInt )
2012-06-15 21:40:21 +05:30
appendToOutFile = . true .
case ( '--rg' , '--regrid' )
2012-06-18 14:57:36 +05:30
spectralRestartInc = IO_IntValue ( commandLine , positions , i + 1_pInt )
appendToOutFile = . false .
2012-06-15 21:40:21 +05:30
end select
2012-04-11 22:58:08 +05:30
enddo
2012-06-15 21:40:21 +05:30
endif
if ( . not . ( gotLoadCase . and . gotGeometry ) ) then
2012-08-03 14:55:48 +05:30
write ( 6 , '(a)' ) ' Please specify Geometry AND Load Case'
2012-06-15 21:40:21 +05:30
call quit ( 1_pInt )
2012-02-21 21:34:16 +05:30
endif
2012-01-30 19:22:41 +05:30
2012-06-15 21:40:21 +05:30
geometryFile = getGeometryFile ( geometryParameter )
loadCaseFile = getLoadCaseFile ( loadCaseParameter )
call get_environment_variable ( 'HOST' , hostName )
call get_environment_variable ( 'USER' , userName )
call date_and_time ( values = dateAndTime )
2012-08-03 14:55:48 +05:30
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 )
2012-08-06 18:13:05 +05:30
write ( 6 , '(a,a)' ) ' Host name: ' , trim ( hostName )
write ( 6 , '(a,a)' ) ' User name: ' , trim ( userName )
write ( 6 , '(a,a)' ) ' Path separator: ' , getPathSep ( )
write ( 6 , '(a,a)' ) ' Command line call: ' , trim ( commandLine )
write ( 6 , '(a,a)' ) ' Geometry parameter: ' , trim ( geometryParameter )
write ( 6 , '(a,a)' ) ' Loadcase parameter: ' , trim ( loadcaseParameter )
write ( 6 , '(a,a)' ) ' Geometry file: ' , trim ( geometryFile )
write ( 6 , '(a,a)' ) ' Loadcase file: ' , trim ( loadCaseFile )
write ( 6 , '(a,a)' ) ' Working Directory: ' , trim ( getSolverWorkingDirectoryName ( ) )
write ( 6 , '(a,a)' ) ' Solver Job Name: ' , trim ( getSolverJobName ( ) )
2012-06-18 14:57:36 +05:30
if ( SpectralRestartInc > 1_pInt ) write ( 6 , '(a,i6.6)' ) &
2012-08-06 18:13:05 +05:30
' Restart at increment: ' , spectralRestartInc
write ( 6 , '(a,l1,/)' ) ' Append to result file: ' , appendToOutFile
2011-11-04 01:02:11 +05:30
2012-03-06 20:22:48 +05:30
end subroutine DAMASK_interface_init
2011-11-04 01:02:11 +05:30
2012-03-06 20:22:48 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief extract working directory from loadcase file possibly based on current working dir
!--------------------------------------------------------------------------------------------------
2012-06-15 21:40:21 +05:30
character ( len = 1024 ) function getSolverWorkingDirectoryName ( )
2011-11-04 01:02:11 +05:30
implicit none
2012-03-09 01:55:28 +05:30
character ( len = 1024 ) :: cwd
character :: pathSep
2012-02-21 21:34:16 +05:30
pathSep = getPathSep ( )
2011-11-04 01:02:11 +05:30
2012-06-15 21:40:21 +05:30
if ( geometryFile ( 1 : 1 ) == pathSep ) then ! absolute path given as command line argument
getSolverWorkingDirectoryName = geometryFile ( 1 : scan ( geometryFile , pathSep , back = . true . ) )
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
else
2012-06-15 21:40:21 +05:30
call getcwd ( cwd ) ! relative path given as command line argument
getSolverWorkingDirectoryName = trim ( cwd ) / / pathSep / / &
geometryFile ( 1 : scan ( geometryFile , pathSep , back = . true . ) )
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
endif
getSolverWorkingDirectoryName = rectifyPath ( getSolverWorkingDirectoryName )
2011-10-18 14:55:17 +05:30
2012-03-06 20:22:48 +05:30
end function getSolverWorkingDirectoryName
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
2011-11-04 01:02:11 +05:30
2012-03-06 20:22:48 +05:30
!--------------------------------------------------------------------------------------------------
2012-06-15 21:40:21 +05:30
!> @brief solver job name (no extension) as combination of geometry and load case name
2012-03-06 20:22:48 +05:30
!--------------------------------------------------------------------------------------------------
character ( len = 1024 ) function getSolverJobName ( )
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
2012-03-06 20:22:48 +05:30
implicit none
2012-02-16 00:28:38 +05:30
integer :: posExt , posSep
2012-02-21 21:34:16 +05:30
character :: pathSep
2012-06-15 21:40:21 +05:30
character ( len = 1024 ) :: tempString
2012-02-21 21:34:16 +05:30
pathSep = getPathSep ( )
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
2012-06-15 21:40:21 +05:30
tempString = geometryFile
posExt = scan ( tempString , '.' , back = . true . )
posSep = scan ( tempString , pathSep , back = . true . )
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
2012-06-15 21:40:21 +05:30
getSolverJobName = tempString ( posSep + 1 : posExt - 1 )
tempString = loadCaseFile
posExt = scan ( tempString , '.' , back = . true . )
posSep = scan ( tempString , pathSep , back = . true . )
getSolverJobName = trim ( getSolverJobName ) / / '_' / / tempString ( posSep + 1 : posExt - 1 )
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
2012-06-15 21:40:21 +05:30
end function getSolverJobName
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
2011-02-07 20:05:42 +05:30
2012-03-06 20:22:48 +05:30
!--------------------------------------------------------------------------------------------------
2012-06-15 21:40:21 +05:30
!> @brief basename of geometry file with extension from command line arguments
2012-03-06 20:22:48 +05:30
!--------------------------------------------------------------------------------------------------
2012-06-15 21:40:21 +05:30
character ( len = 1024 ) function getGeometryFile ( geometryParameter )
2011-02-07 20:05:42 +05:30
2012-03-06 20:22:48 +05:30
implicit none
2012-06-15 21:40:21 +05:30
character ( len = 1024 ) , intent ( in ) :: &
geometryParameter
character ( len = 1024 ) :: &
cwd
integer :: posExt , posSep
2012-02-21 21:34:16 +05:30
character :: pathSep
2011-02-07 20:05:42 +05:30
2012-06-15 21:40:21 +05:30
getGeometryFile = geometryParameter
2012-02-21 21:34:16 +05:30
pathSep = getPathSep ( )
2012-06-15 21:40:21 +05:30
posExt = scan ( getGeometryFile , '.' , back = . true . )
posSep = scan ( getGeometryFile , pathSep , back = . true . )
if ( posExt < = posSep ) getGeometryFile = trim ( getGeometryFile ) / / ( '.geom' ) ! no extension present
if ( scan ( getGeometryFile , pathSep ) / = 1 ) then ! relative path given as command line argument
call getcwd ( cwd )
getGeometryFile = rectifyPath ( trim ( cwd ) / / pathSep / / getGeometryFile )
else
getGeometryFile = rectifyPath ( getGeometryFile )
endif
2011-02-07 20:05:42 +05:30
2012-06-15 21:40:21 +05:30
getGeometryFile = makeRelativePath ( getSolverWorkingDirectoryName ( ) , getGeometryFile )
2011-02-07 20:05:42 +05:30
2012-06-15 21:40:21 +05:30
end function getGeometryFile
2011-02-07 20:05:42 +05:30
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
2012-03-06 20:22:48 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief relative path of loadcase from command line arguments
!--------------------------------------------------------------------------------------------------
2012-06-15 21:40:21 +05:30
character ( len = 1024 ) function getLoadCaseFile ( loadCaseParameter )
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
implicit none
2012-06-15 21:40:21 +05:30
character ( len = 1024 ) , intent ( in ) :: &
loadCaseParameter
character ( len = 1024 ) :: &
cwd
integer :: posExt , posSep
2012-02-21 21:34:16 +05:30
character :: pathSep
2012-06-15 21:40:21 +05:30
getLoadCaseFile = loadcaseParameter
2012-02-21 21:34:16 +05:30
pathSep = getPathSep ( )
2012-06-15 21:40:21 +05:30
posExt = scan ( getLoadCaseFile , '.' , back = . true . )
posSep = scan ( getLoadCaseFile , pathSep , back = . true . )
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
2012-06-15 21:40:21 +05:30
if ( posExt < = posSep ) getLoadCaseFile = trim ( getLoadCaseFile ) / / ( '.load' ) ! no extension present
if ( scan ( getLoadCaseFile , pathSep ) / = 1 ) then ! relative path given as command line argument
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
call getcwd ( cwd )
2012-06-15 21:40:21 +05:30
getLoadCaseFile = rectifyPath ( trim ( cwd ) / / pathSep / / getLoadCaseFile )
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
else
2012-06-15 21:40:21 +05:30
getLoadCaseFile = rectifyPath ( getLoadCaseFile )
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
endif
2012-06-15 21:40:21 +05:30
getLoadCaseFile = makeRelativePath ( getSolverWorkingDirectoryName ( ) , getLoadCaseFile )
end function getLoadCaseFile
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
2012-03-06 20:22:48 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief remove ../ and ./ from path
!--------------------------------------------------------------------------------------------------
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
function rectifyPath ( path )
implicit none
2012-02-16 00:28:38 +05:30
character ( len = * ) :: path
character ( len = len_trim ( path ) ) :: rectifyPath
2012-02-21 21:34:16 +05:30
character :: pathSep
2012-02-16 00:28:38 +05:30
integer :: i , j , k , l !no pInt
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
2012-02-21 21:34:16 +05:30
pathSep = getPathSep ( )
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
!remove ./ from path
l = len_trim ( path )
rectifyPath = path
2012-02-16 00:28:38 +05:30
do i = l , 3 , - 1
2012-02-21 21:34:16 +05:30
if ( rectifyPath ( i - 1 : i ) == '.' / / pathSep . and . rectifyPath ( i - 2 : i - 2 ) / = '.' ) &
2012-02-16 00:28:38 +05:30
rectifyPath ( i - 1 : l ) = rectifyPath ( i + 1 : l ) / / ' '
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
enddo
!remove ../ and corresponding directory from rectifyPath
l = len_trim ( rectifyPath )
2012-02-21 21:34:16 +05:30
i = index ( rectifyPath ( i : l ) , '..' / / pathSep )
2012-02-16 00:28:38 +05:30
j = 0
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
do while ( i > j )
2012-02-21 21:34:16 +05:30
j = scan ( rectifyPath ( 1 : i - 2 ) , pathSep , back = . true . )
2012-02-16 00:28:38 +05:30
rectifyPath ( j + 1 : l ) = rectifyPath ( i + 3 : l ) / / repeat ( ' ' , 2 + i - j )
2012-03-06 20:22:48 +05:30
if ( rectifyPath ( j + 1 : j + 1 ) == pathSep ) then !search for '//' that appear in case of XXX/../../XXX
2012-01-13 20:52:42 +05:30
k = len_trim ( rectifyPath )
2012-02-16 00:28:38 +05:30
rectifyPath ( j + 1 : k - 1 ) = rectifyPath ( j + 2 : k )
2012-01-13 20:52:42 +05:30
rectifyPath ( k : k ) = ' '
endif
2012-02-21 21:34:16 +05:30
i = j + index ( rectifyPath ( j + 1 : l ) , '..' / / pathSep )
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
enddo
2012-02-21 21:34:16 +05:30
if ( len_trim ( rectifyPath ) == 0 ) rectifyPath = pathSep
2011-08-01 23:40:55 +05:30
2012-03-06 20:22:48 +05:30
end function rectifyPath
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
2012-03-06 20:22:48 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief relative path from absolute a to absolute b
!--------------------------------------------------------------------------------------------------
character ( len = 1024 ) function makeRelativePath ( a , b )
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
implicit none
character ( len = * ) :: a , b
2012-02-21 21:34:16 +05:30
character :: pathSep
2012-02-16 00:28:38 +05:30
integer :: i , posLastCommonSlash , remainingSlashes !no pInt
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
2012-02-21 21:34:16 +05:30
pathSep = getPathSep ( )
2012-02-16 00:28:38 +05:30
posLastCommonSlash = 0
remainingSlashes = 0
2012-02-21 21:34:16 +05:30
2012-02-16 00:28:38 +05:30
do i = 1 , min ( 1024 , len_trim ( a ) , len_trim ( b ) )
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
if ( a ( i : i ) / = b ( i : i ) ) exit
2012-02-21 21:34:16 +05:30
if ( a ( i : i ) == pathSep ) posLastCommonSlash = i
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
enddo
2012-02-16 00:28:38 +05:30
do i = posLastCommonSlash + 1 , len_trim ( a )
2012-02-21 21:34:16 +05:30
if ( a ( i : i ) == pathSep ) remainingSlashes = remainingSlashes + 1
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
enddo
2012-02-21 21:34:16 +05:30
makeRelativePath = repeat ( '..' / / pathSep , remainingSlashes ) / / b ( posLastCommonSlash + 1 : len_trim ( b ) )
2011-08-01 23:40:55 +05:30
2012-03-06 20:22:48 +05:30
end function makeRelativePath
added fftw3 as fft(library will not versioned, should be in a linkable folder) , did some corrections on the code, splitted main file up (allows use of makefile), added makefile
changes on mpie_spectral.f90:
new structure, changed variable names, now using defgrad instead of disgrad, cleaned up, removed augmented Lagrange.
ToDo: Implement Augmented Lagrange again (but then a working version), implement Large strain, think about complex-to real-transform backwards, try to implement MP-support
2010-08-27 22:09:38 +05:30
2012-02-21 21:34:16 +05:30
2012-03-06 20:22:48 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief counting / and \ in $PATH System variable the character occuring more often is assumed
!! to be the path separator
!--------------------------------------------------------------------------------------------------
character function getPathSep ( )
2012-02-21 21:34:16 +05:30
implicit none
character ( len = 2048 ) path
integer ( pInt ) :: backslash = 0_pInt , slash = 0_pInt
integer :: i
call get_environment_variable ( 'PATH' , path )
do i = 1 , len ( trim ( path ) )
if ( path ( i : i ) == '/' ) slash = slash + 1_pInt
if ( path ( i : i ) == ' \ ' ) backslash = backslash + 1_pInt
enddo
if ( backslash > slash ) then
getPathSep = ' \ '
else
getPathSep = '/'
endif
2012-06-15 21:40:21 +05:30
end function getPathSep
!********************************************************************
! read string value at myPos from line
!********************************************************************
pure function IO_stringValue ( line , positions , myPos )
implicit none
integer ( pInt ) , intent ( in ) :: positions ( * ) , &
myPos
character ( len = 1 + positions ( myPos * 2 + 1 ) - positions ( myPos * 2 ) ) :: IO_stringValue
character ( len = * ) , intent ( in ) :: line
if ( positions ( 1 ) < myPos ) then
IO_stringValue = ''
else
IO_stringValue = line ( positions ( myPos * 2 ) : positions ( myPos * 2 + 1 ) )
endif
end function IO_stringValue
!********************************************************************
! read int value at myPos from line
!********************************************************************
integer ( pInt ) pure function IO_intValue ( line , positions , myPos )
implicit none
character ( len = * ) , intent ( in ) :: line
integer ( pInt ) , intent ( in ) :: positions ( * ) , &
myPos
if ( positions ( 1 ) < myPos ) then
IO_intValue = 0_pInt
else
read ( UNIT = line ( positions ( myPos * 2 ) : positions ( myPos * 2 + 1 ) ) , ERR = 100 , FMT = * ) IO_intValue
endif
return
100 IO_intValue = huge ( 1_pInt )
end function IO_intValue
!********************************************************************
! change character in line to lower case
!********************************************************************
pure function IO_lc ( line )
implicit none
character ( 26 ) , parameter :: lower = 'abcdefghijklmnopqrstuvwxyz'
character ( 26 ) , parameter :: upper = 'ABCDEFGHIJKLMNOPQRSTUVWXYZ'
character ( len = * ) , intent ( in ) :: line
character ( len = len ( line ) ) :: IO_lc
integer :: i , n ! no pInt (len returns default integer)
IO_lc = line
do i = 1 , len ( line )
n = index ( upper , IO_lc ( i : i ) )
if ( n / = 0 ) IO_lc ( i : i ) = lower ( n : n )
enddo
end function IO_lc
!********************************************************************
! locate at most N space-separated parts in line
! return array containing number of parts in line and
! the left/right positions of at most N to be used by IO_xxxVal
!********************************************************************
pure function IO_stringPos ( line , N )
implicit none
integer ( pInt ) , intent ( in ) :: N
integer ( pInt ) :: IO_stringPos ( 1_pInt + N * 2_pInt )
character ( len = * ) , intent ( in ) :: line
character ( len = * ) , parameter :: sep = achar ( 44 ) / / achar ( 32 ) / / achar ( 9 ) / / achar ( 10 ) / / achar ( 13 ) ! comma and whitespaces
integer :: left , right !no pInt (verify and scan return default integer)
IO_stringPos = - 1_pInt
IO_stringPos ( 1 ) = 0_pInt
right = 0
do while ( verify ( line ( right + 1 : ) , sep ) > 0 )
left = right + verify ( line ( right + 1 : ) , sep )
right = left + scan ( line ( left : ) , sep ) - 2
if ( line ( left : left ) == '#' ) then
exit
endif
if ( IO_stringPos ( 1 ) < N ) then
IO_stringPos ( 1_pInt + IO_stringPos ( 1 ) * 2_pInt + 1_pInt ) = int ( left , pInt )
IO_stringPos ( 1_pInt + IO_stringPos ( 1 ) * 2_pInt + 2_pInt ) = int ( right , pInt )
endif
IO_stringPos ( 1 ) = IO_stringPos ( 1 ) + 1_pInt
enddo
end function IO_stringPos
2012-02-21 21:34:16 +05:30
2012-03-06 20:22:48 +05:30
end module