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
!--------------------------------------------------------------------------------------------------
2013-01-02 22:32:12 +05:30
!> @author Martin Diehl, Max-Planck-Institut für Eisenforschung GmbH
!> @author Philip Eisenlohr, Max-Planck-Institut für Eisenforschung GmbH
!> @brief Interfacing between the spectral solver and the material subroutines provided
!! by DAMASK
!> @details Interfacing between the spectral solver and the material subroutines provided
!> by DAMASK. Interpretating the command line arguments or, in case of called from f2py,
!> the arguments parsed to the init routine to get load case, geometry file, working
!> directory, etc.
2012-03-06 20:22:48 +05:30
!--------------------------------------------------------------------------------------------------
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-11-06 21:30:51 +05:30
#ifdef PETSc
#include <finclude/petscsys.h>
#endif
2013-01-02 22:32:12 +05:30
logical , public , protected :: appendToOutFile = . false . !< Append to existing spectralOut file (in case of restart, not in case of regridding)
integer ( pInt ) , public , protected :: spectralRestartInc = 1_pInt !< Increment at which calculation starts
character ( len = 1024 ) , public , protected :: &
2012-06-15 21:40:21 +05:30
geometryFile = '' , & !< parameter given for geometry file
loadCaseFile = '' !< parameter given for load case file
2013-01-02 22:32:12 +05:30
character ( len = 1024 ) , private :: workingDirectory !< accessed by getSolverWorkingDirectoryName for compatibility reasons
2012-06-15 21:40:21 +05:30
public :: getSolverWorkingDirectoryName , &
2012-03-06 20:22:48 +05:30
getSolverJobName , &
2012-04-11 22:58:08 +05:30
DAMASK_interface_init
2013-01-02 22:32:12 +05:30
private :: storeWorkingDirectory , &
getGeometryFile , &
2012-06-15 21:40:21 +05:30
getLoadCaseFile , &
rectifyPath , &
2012-03-06 20:22:48 +05:30
makeRelativePath , &
2012-06-15 21:40:21 +05:30
getPathSep , &
2013-01-02 22:32:12 +05:30
IIO_stringValue , &
IIO_intValue , &
IIO_lc , &
IIO_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-11-06 21:30:51 +05:30
2012-04-11 22:58:08 +05:30
character ( len = 1024 ) , optional , intent ( in ) :: &
2013-01-02 22:32:12 +05:30
loadCaseParameterIn , & !< if using the f2py variant, the -l argument of DAMASK_spectral.exe
geometryParameterIn !< if using the f2py variant, the -g argument of DAMASK_spectral.exe
2012-04-11 22:58:08 +05:30
character ( len = 1024 ) :: &
commandLine , & !< command line call as string
2013-01-02 22:32:12 +05:30
loadCaseArg = '' , & !< -l argument given to DAMASK_spectral.exe
geometryArg = '' , & !< -g argument given to DAMASK_spectral.exe
workingDirArg = '' , & !< -w argument given to DAMASK_spectral.exe
hostName , & !< name of machine on which DAMASK_spectral.exe is execute (might require export HOSTNAME)
userName , & !< name of user calling DAMASK_spectral.exe
2012-06-15 21:40:21 +05:30
tag
2012-04-11 22:58:08 +05:30
integer :: &
2012-06-15 21:40:21 +05:30
i
integer , parameter :: &
2013-01-02 22:32:12 +05:30
maxNchunks = 10 !< DAMASK_spectral + (l,g,w,r)*2 + h
2012-06-15 21:40:21 +05:30
integer , dimension ( 1 + 2 * maxNchunks ) :: &
positions
2012-04-11 22:58:08 +05:30
integer , dimension ( 8 ) :: &
dateAndTime ! type default integer
2012-11-06 21:30:51 +05:30
#ifdef PETSc
PetscErrorCode :: ierr
2013-01-02 22:32:12 +05:30
2012-11-06 21:30:51 +05:30
!--------------------------------------------------------------------------------------------------
! PETSc Init
call PetscInitialize ( PETSC_NULL_CHARACTER , ierr ) ! according to PETSc manual, that should be the first line in the code
CHKERRQ ( ierr ) ! this is a macro definition, it is case sensitive
#endif
2012-10-04 19:52:39 +05:30
open ( 6 , encoding = 'UTF-8' ) ! modern fortran compilers (gfortran >4.4, ifort >11 support it)
2013-01-02 22:32:12 +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
2013-01-02 22:32:12 +05:30
geometryArg = geometryParameterIn
loadcaseArg = loadcaseParameterIn
2012-06-18 14:57:36 +05:30
commandLine = 'n/a'
2012-06-15 21:40:21 +05:30
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 )
2013-01-02 22:32:12 +05:30
positions = IIO_stringPos ( commandLine , maxNchunks )
2012-06-15 21:40:21 +05:30
do i = 1 , maxNchunks
2013-01-02 22:32:12 +05:30
tag = IIO_lc ( IIO_stringValue ( commandLine , positions , i ) ) ! extract key
2012-06-15 21:40:21 +05:30
select case ( tag )
case ( '-h' , '--help' )
2013-01-02 22:32:12 +05:30
write ( 6 , '(a)' ) ' #######################################################################'
write ( 6 , '(a)' ) ' DAMASK_spectral:'
2012-08-03 14:55:48 +05:30
write ( 6 , '(a)' ) ' The spectral method boundary value problem solver for'
2013-01-02 22:32:12 +05:30
write ( 6 , '(a)' ) ' the Düsseldorf 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)' ) ' --workingdir (-w, --wd, --workingdirectory)'
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)' ) ' --geom PathToGeomFile/NameOfGeom.geom'
write ( 6 , '(a)' ) ' Specifies the location of the geometry definition file,'
write ( 6 , '(a)' ) ' if no extension is given, .geom will be appended.'
write ( 6 , '(a)' ) ' "PathToGeomFile" will be the working directory if not specified'
write ( 6 , '(a)' ) ' via --workingdir.'
2012-08-03 14:55:48 +05:30
write ( 6 , '(a)' ) ' Make sure the file "material.config" exists in the working'
2013-01-02 22:32:12 +05:30
write ( 6 , '(a)' ) ' directory.'
2012-08-03 14:55:48 +05:30
write ( 6 , '(a)' ) ' For further configuration place "numerics.config"'
2013-01-02 22:32:12 +05:30
write ( 6 , '(a)' ) ' and "numerics.config" in that directory.'
write ( 6 , '(/,a)' ) ' --load PathToLoadFile/NameOfLoadFile.load'
write ( 6 , '(a)' ) ' Specifies the location of the load case definition file,'
write ( 6 , '(a)' ) ' if no extension is given, .load will be appended.'
write ( 6 , '(/,a)' ) ' -----------------------------------------------------------------------'
write ( 6 , '(a)' ) ' Optional arguments:'
write ( 6 , '(/,a)' ) ' --workingdirectory PathToWorkingDirectory'
write ( 6 , '(a)' ) ' Specifies the working directory and overwrites the default'
write ( 6 , '(a)' ) ' "PathToGeomFile".'
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)' ) ' --restart XX'
2012-08-03 14:55:48 +05:30
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.'
2013-01-02 22:32:12 +05:30
write ( 6 , '(/,a)' ) ' --regrid XX'
2012-08-03 14:55:48 +05:30
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.'
2013-01-02 22:32:12 +05:30
write ( 6 , '(/,a)' ) ' -----------------------------------------------------------------------'
2012-08-03 14:55:48 +05:30
write ( 6 , '(a)' ) ' Help:'
2013-01-02 22:32:12 +05:30
write ( 6 , '(/,a)' ) ' --help'
write ( 6 , '(a,/)' ) ' Prints this message and exits'
2012-06-15 21:40:21 +05:30
call quit ( 0_pInt ) ! normal Termination
case ( '-l' , '--load' , '--loadcase' )
2013-01-02 22:32:12 +05:30
loadcaseArg = IIO_stringValue ( commandLine , positions , i + 1_pInt )
2012-06-15 21:40:21 +05:30
case ( '-g' , '--geom' , '--geometry' )
2013-01-02 22:32:12 +05:30
geometryArg = IIO_stringValue ( commandLine , positions , i + 1_pInt )
case ( '-w' , '--wd' , '--workingdir' , '--workingdirectory' )
workingDirArg = IIO_stringValue ( commandLine , positions , i + 1_pInt )
2012-06-15 21:40:21 +05:30
case ( '-r' , '--rs' , '--restart' )
2013-01-02 22:32:12 +05:30
spectralRestartInc = IIO_IntValue ( commandLine , positions , i + 1_pInt )
2012-06-15 21:40:21 +05:30
appendToOutFile = . true .
case ( '--rg' , '--regrid' )
2013-01-02 22:32:12 +05:30
spectralRestartInc = IIO_IntValue ( commandLine , positions , i + 1_pInt )
2012-06-18 14:57:36 +05:30
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
2013-01-02 22:32:12 +05:30
if ( len ( trim ( loadcaseArg ) ) == 0 . or . len ( trim ( geometryArg ) ) == 0 ) then
write ( 6 , '(a)' ) ' Please specify geometry AND load case (-h for help)'
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
2013-01-02 22:32:12 +05:30
workingDirectory = storeWorkingDirectory ( trim ( workingDirArg ) , trim ( geometryArg ) )
geometryFile = getGeometryFile ( geometryArg )
loadCaseFile = getLoadCaseFile ( loadCaseArg )
2012-06-15 21:40:21 +05:30
2012-12-13 19:23:54 +05:30
call get_environment_variable ( 'HOSTNAME' , hostName )
2012-06-15 21:40:21 +05:30
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 )
2013-01-02 22:32:12 +05:30
if ( len ( trim ( workingDirArg ) ) > 0 ) &
write ( 6 , '(a,a)' ) ' Working dir argument: ' , trim ( workingDirArg )
write ( 6 , '(a,a)' ) ' Geometry argument: ' , trim ( geometryArg )
write ( 6 , '(a,a)' ) ' Loadcase argument: ' , trim ( loadcaseArg )
write ( 6 , '(a,a)' ) ' Working directory: ' , trim ( getSolverWorkingDirectoryName ( ) )
2012-08-06 18:13:05 +05:30
write ( 6 , '(a,a)' ) ' Geometry file: ' , trim ( geometryFile )
write ( 6 , '(a,a)' ) ' Loadcase file: ' , trim ( loadCaseFile )
2013-01-02 22:32:12 +05:30
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
2013-01-02 22:32:12 +05:30
2012-03-06 20:22:48 +05:30
!--------------------------------------------------------------------------------------------------
2013-01-02 22:32:12 +05:30
!> @brief extract working directory from loadcase file possibly based on current working dir
2012-03-06 20:22:48 +05:30
!--------------------------------------------------------------------------------------------------
2013-01-02 22:32:12 +05:30
character ( len = 1024 ) function storeWorkingDirectory ( workingDirectoryArg , geometryArg )
2011-11-04 01:02:11 +05:30
implicit none
2013-01-02 22:32:12 +05:30
character ( len = * ) , intent ( in ) :: workingDirectoryArg
character ( len = * ) , intent ( in ) :: geometryArg
character ( len = 1024 ) :: cwd
character :: pathSep
2012-02-21 21:34:16 +05:30
pathSep = getPathSep ( )
2013-01-02 22:32:12 +05:30
if ( len ( workingDirectoryArg ) > 0 ) then ! got working directory as input
if ( workingDirectoryArg ( 1 : 1 ) == pathSep ) then ! absolute path given as command line argument
storeWorkingDirectory = workingDirectoryArg
else
call getcwd ( cwd ) ! relative path given as command line argument
storeWorkingDirectory = trim ( cwd ) / / pathSep / / workingDirectoryArg
endif
if ( storeWorkingDirectory ( len ( trim ( storeWorkingDirectory ) ) : len ( trim ( storeWorkingDirectory ) ) ) & ! if path seperator is not given, append it
/ = pathSep ) storeWorkingDirectory = trim ( storeWorkingDirectory ) / / pathSep
else ! using path to geometry file as working dir
if ( geometryArg ( 1 : 1 ) == pathSep ) then ! absolute path given as command line argument
storeWorkingDirectory = geometryArg ( 1 : scan ( geometryArg , pathSep , back = . true . ) )
else
call getcwd ( cwd ) ! relative path given as command line argument
storeWorkingDirectory = trim ( cwd ) / / pathSep / / &
geometryArg ( 1 : scan ( geometryArg , pathSep , back = . true . ) )
endif
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
2013-01-02 22:32:12 +05:30
storeWorkingDirectory = rectifyPath ( storeWorkingDirectory )
2011-10-18 14:55:17 +05:30
2013-01-02 22:32:12 +05:30
end function storeWorkingDirectory
!--------------------------------------------------------------------------------------------------
!> @brief simply returns the private string workingDir
!--------------------------------------------------------------------------------------------------
character ( len = 1024 ) function getSolverWorkingDirectoryName ( )
implicit none
getSolverWorkingDirectoryName = workingDirectory
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
2013-01-02 22:32:12 +05:30
! to be the path separator
2012-03-06 20:22:48 +05:30
!--------------------------------------------------------------------------------------------------
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
2013-01-02 22:32:12 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief taken from IO, check IO_stringValue for documentation
!--------------------------------------------------------------------------------------------------
pure function IIO_stringValue ( line , positions , myPos )
2012-06-15 21:40:21 +05:30
implicit none
integer ( pInt ) , intent ( in ) :: positions ( * ) , &
myPos
2013-01-02 22:32:12 +05:30
character ( len = 1 + positions ( myPos * 2 + 1 ) - positions ( myPos * 2 ) ) :: IIO_stringValue
2012-06-15 21:40:21 +05:30
character ( len = * ) , intent ( in ) :: line
if ( positions ( 1 ) < myPos ) then
2013-01-02 22:32:12 +05:30
IIO_stringValue = ''
2012-06-15 21:40:21 +05:30
else
2013-01-02 22:32:12 +05:30
IIO_stringValue = line ( positions ( myPos * 2 ) : positions ( myPos * 2 + 1 ) )
2012-06-15 21:40:21 +05:30
endif
2013-01-02 22:32:12 +05:30
end function IIO_stringValue
2012-06-15 21:40:21 +05:30
2013-01-02 22:32:12 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief taken from IO, check IO_stringValue for documentation
!--------------------------------------------------------------------------------------------------
integer ( pInt ) pure function IIO_intValue ( line , positions , myPos )
2012-06-15 21:40:21 +05:30
implicit none
character ( len = * ) , intent ( in ) :: line
integer ( pInt ) , intent ( in ) :: positions ( * ) , &
myPos
if ( positions ( 1 ) < myPos ) then
2013-01-02 22:32:12 +05:30
IIO_intValue = 0_pInt
2012-06-15 21:40:21 +05:30
else
2013-01-02 22:32:12 +05:30
read ( UNIT = line ( positions ( myPos * 2 ) : positions ( myPos * 2 + 1 ) ) , ERR = 100 , FMT = * ) IIO_intValue
2012-06-15 21:40:21 +05:30
endif
return
2013-01-02 22:32:12 +05:30
100 IIO_intValue = huge ( 1_pInt )
end function IIO_intValue
2012-06-15 21:40:21 +05:30
2013-01-02 22:32:12 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief taken from IO, check IO_lc for documentation
!--------------------------------------------------------------------------------------------------
pure function IIO_lc ( line )
2012-06-15 21:40:21 +05:30
implicit none
character ( 26 ) , parameter :: lower = 'abcdefghijklmnopqrstuvwxyz'
character ( 26 ) , parameter :: upper = 'ABCDEFGHIJKLMNOPQRSTUVWXYZ'
character ( len = * ) , intent ( in ) :: line
2013-01-02 22:32:12 +05:30
character ( len = len ( line ) ) :: IIO_lc
2012-06-15 21:40:21 +05:30
2013-01-02 22:32:12 +05:30
integer :: i , n ! no pInt (len returns default integer)
2012-06-15 21:40:21 +05:30
2013-01-02 22:32:12 +05:30
IIO_lc = line
2012-06-15 21:40:21 +05:30
do i = 1 , len ( line )
2013-01-02 22:32:12 +05:30
n = index ( upper , IIO_lc ( i : i ) )
if ( n / = 0 ) IIO_lc ( i : i ) = lower ( n : n )
2012-06-15 21:40:21 +05:30
enddo
2013-01-02 22:32:12 +05:30
end function IIO_lc
2012-06-15 21:40:21 +05:30
2013-01-02 22:32:12 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief taken from IO, check IO_stringPos for documentation
!--------------------------------------------------------------------------------------------------
pure function IIO_stringPos ( line , N )
2012-06-15 21:40:21 +05:30
implicit none
integer ( pInt ) , intent ( in ) :: N
2013-01-02 22:32:12 +05:30
integer ( pInt ) :: IIO_stringPos ( 1_pInt + N * 2_pInt )
2012-06-15 21:40:21 +05:30
character ( len = * ) , intent ( in ) :: line
2013-01-02 22:32:12 +05:30
character ( len = * ) , parameter :: sep = achar ( 44 ) / / achar ( 32 ) / / achar ( 9 ) / / achar ( 10 ) / / achar ( 13 ) ! comma and whitespaces
2012-06-15 21:40:21 +05:30
2013-01-02 22:32:12 +05:30
integer :: left , right !no pInt (verify and scan return default integer)
2012-06-15 21:40:21 +05:30
2013-01-02 22:32:12 +05:30
IIO_stringPos = - 1_pInt
IIO_stringPos ( 1 ) = 0_pInt
2012-06-15 21:40:21 +05:30
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
2013-01-02 22:32:12 +05:30
if ( IIO_stringPos ( 1 ) < N ) then
IIO_stringPos ( 1_pInt + IIO_stringPos ( 1 ) * 2_pInt + 1_pInt ) = int ( left , pInt )
IIO_stringPos ( 1_pInt + IIO_stringPos ( 1 ) * 2_pInt + 2_pInt ) = int ( right , pInt )
2012-06-15 21:40:21 +05:30
endif
2013-01-02 22:32:12 +05:30
IIO_stringPos ( 1 ) = IIO_stringPos ( 1 ) + 1_pInt
2012-06-15 21:40:21 +05:30
enddo
2013-01-02 22:32:12 +05:30
end function IIO_stringPos
2012-02-21 21:34:16 +05:30
2012-03-06 20:22:48 +05:30
end module