2016-05-05 16:30:46 +05:30
|
|
|
!--------------------------------------------------------------------------------------------------
|
|
|
|
!> @author Martin Diehl, Max-Planck-Institut für Eisenforschung GmbH
|
|
|
|
!> @brief provides wrappers to C routines
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
2016-03-12 01:29:14 +05:30
|
|
|
module system_routines
|
2019-05-11 01:18:43 +05:30
|
|
|
use, intrinsic :: ISO_C_Binding
|
2020-01-26 16:49:36 +05:30
|
|
|
|
|
|
|
use prec
|
|
|
|
|
2019-03-24 16:29:00 +05:30
|
|
|
implicit none
|
|
|
|
|
|
|
|
public :: &
|
|
|
|
signalterm_C, &
|
|
|
|
signalusr1_C, &
|
|
|
|
signalusr2_C, &
|
|
|
|
isDirectory, &
|
|
|
|
getCWD, &
|
|
|
|
getHostName, &
|
|
|
|
setCWD
|
2019-02-11 23:16:14 +05:30
|
|
|
|
2019-03-24 16:29:00 +05:30
|
|
|
interface
|
2019-02-11 23:16:14 +05:30
|
|
|
|
2019-03-24 16:29:00 +05:30
|
|
|
function isDirectory_C(path) bind(C)
|
|
|
|
use, intrinsic :: ISO_C_Binding, only: &
|
|
|
|
C_INT, &
|
|
|
|
C_CHAR
|
2020-01-26 16:49:36 +05:30
|
|
|
|
|
|
|
use prec
|
|
|
|
|
2019-03-24 16:29:00 +05:30
|
|
|
integer(C_INT) :: isDirectory_C
|
2020-01-26 16:49:36 +05:30
|
|
|
character(kind=C_CHAR), dimension(pPathLen), intent(in) :: path ! C string is an array
|
2019-03-24 16:29:00 +05:30
|
|
|
end function isDirectory_C
|
|
|
|
|
2020-01-26 16:49:36 +05:30
|
|
|
subroutine getCurrentWorkDir_C(path, stat) bind(C)
|
2019-03-24 16:29:00 +05:30
|
|
|
use, intrinsic :: ISO_C_Binding, only: &
|
|
|
|
C_INT, &
|
|
|
|
C_CHAR
|
2020-01-26 16:49:36 +05:30
|
|
|
|
|
|
|
use prec
|
|
|
|
|
|
|
|
character(kind=C_CHAR), dimension(pPathLen), intent(out) :: path ! C string is an array
|
|
|
|
integer(C_INT), intent(out) :: stat
|
2019-03-24 16:29:00 +05:30
|
|
|
end subroutine getCurrentWorkDir_C
|
|
|
|
|
|
|
|
subroutine getHostName_C(str, stat) bind(C)
|
|
|
|
use, intrinsic :: ISO_C_Binding, only: &
|
|
|
|
C_INT, &
|
|
|
|
C_CHAR
|
2020-01-26 16:49:36 +05:30
|
|
|
|
|
|
|
use prec
|
|
|
|
|
|
|
|
character(kind=C_CHAR), dimension(pStringLen), intent(out) :: str ! C string is an array
|
|
|
|
integer(C_INT), intent(out) :: stat
|
2019-03-24 16:29:00 +05:30
|
|
|
end subroutine getHostName_C
|
|
|
|
|
|
|
|
function chdir_C(path) bind(C)
|
|
|
|
use, intrinsic :: ISO_C_Binding, only: &
|
|
|
|
C_INT, &
|
|
|
|
C_CHAR
|
2020-01-26 16:49:36 +05:30
|
|
|
|
|
|
|
use prec
|
|
|
|
|
2019-03-24 16:29:00 +05:30
|
|
|
integer(C_INT) :: chdir_C
|
2020-01-26 16:49:36 +05:30
|
|
|
character(kind=C_CHAR), dimension(pPathLen), intent(in) :: path ! C string is an array
|
2019-03-24 16:29:00 +05:30
|
|
|
end function chdir_C
|
|
|
|
|
|
|
|
subroutine signalterm_C(handler) bind(C)
|
|
|
|
use, intrinsic :: ISO_C_Binding, only: &
|
|
|
|
C_FUNPTR
|
2020-01-26 16:49:36 +05:30
|
|
|
|
2019-03-24 16:29:00 +05:30
|
|
|
type(C_FUNPTR), intent(in), value :: handler
|
|
|
|
end subroutine signalterm_C
|
|
|
|
|
|
|
|
subroutine signalusr1_C(handler) bind(C)
|
|
|
|
use, intrinsic :: ISO_C_Binding, only: &
|
|
|
|
C_FUNPTR
|
2020-01-26 16:49:36 +05:30
|
|
|
|
2019-03-24 16:29:00 +05:30
|
|
|
type(C_FUNPTR), intent(in), value :: handler
|
|
|
|
end subroutine signalusr1_C
|
|
|
|
|
2019-02-11 23:16:14 +05:30
|
|
|
subroutine signalusr2_C(handler) bind(C)
|
2019-03-24 16:29:00 +05:30
|
|
|
use, intrinsic :: ISO_C_Binding, only: &
|
|
|
|
C_FUNPTR
|
2020-01-26 16:49:36 +05:30
|
|
|
|
2019-03-24 16:29:00 +05:30
|
|
|
type(C_FUNPTR), intent(in), value :: handler
|
|
|
|
end subroutine signalusr2_C
|
|
|
|
|
|
|
|
end interface
|
2016-03-12 01:29:14 +05:30
|
|
|
|
|
|
|
contains
|
|
|
|
|
2016-05-05 16:30:46 +05:30
|
|
|
!--------------------------------------------------------------------------------------------------
|
|
|
|
!> @brief figures out if a given path is a directory (and not an ordinary file)
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
|
|
|
logical function isDirectory(path)
|
2019-02-11 23:16:14 +05:30
|
|
|
|
2019-05-11 01:18:43 +05:30
|
|
|
character(len=*), intent(in) :: path
|
2020-01-26 16:49:36 +05:30
|
|
|
character(kind=C_CHAR), dimension(pPathLen) :: strFixedLength ! C string as array
|
2019-05-11 01:18:43 +05:30
|
|
|
integer :: i
|
|
|
|
|
|
|
|
strFixedLength = repeat(C_NULL_CHAR,len(strFixedLength))
|
|
|
|
do i=1,len(path) ! copy array components
|
|
|
|
strFixedLength(i)=path(i:i)
|
|
|
|
enddo
|
|
|
|
isDirectory=merge(.True.,.False.,isDirectory_C(strFixedLength) /= 0_C_INT)
|
2016-03-12 01:29:14 +05:30
|
|
|
|
2016-05-05 16:30:46 +05:30
|
|
|
end function isDirectory
|
2016-03-12 01:29:14 +05:30
|
|
|
|
|
|
|
|
2016-05-05 16:30:46 +05:30
|
|
|
!--------------------------------------------------------------------------------------------------
|
|
|
|
!> @brief gets the current working directory
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
2020-01-04 22:55:59 +05:30
|
|
|
function getCWD()
|
2019-02-11 23:16:14 +05:30
|
|
|
|
2020-01-26 16:49:36 +05:30
|
|
|
character(kind=C_CHAR), dimension(pPathLen) :: charArray ! C string is an array
|
|
|
|
character(len=:), allocatable :: getCWD
|
2019-05-11 01:18:43 +05:30
|
|
|
integer(C_INT) :: stat
|
|
|
|
integer :: i
|
|
|
|
|
|
|
|
call getCurrentWorkDir_C(charArray,stat)
|
2020-01-04 22:55:59 +05:30
|
|
|
|
2019-05-11 01:18:43 +05:30
|
|
|
if (stat /= 0_C_INT) then
|
|
|
|
getCWD = 'Error occured when getting currend working directory'
|
|
|
|
else
|
2020-01-26 16:49:36 +05:30
|
|
|
allocate(character(len=pPathLen)::getCWD)
|
2019-05-11 01:18:43 +05:30
|
|
|
arrayToString: do i=1,len(getCWD)
|
|
|
|
if (charArray(i) /= C_NULL_CHAR) then
|
|
|
|
getCWD(i:i)=charArray(i)
|
|
|
|
else
|
2020-01-04 22:55:59 +05:30
|
|
|
getCWD = getCWD(:i-1)
|
2019-05-11 01:18:43 +05:30
|
|
|
exit
|
|
|
|
endif
|
|
|
|
enddo arrayToString
|
|
|
|
endif
|
2016-03-12 01:29:14 +05:30
|
|
|
|
2016-05-05 16:30:46 +05:30
|
|
|
end function getCWD
|
2016-03-12 01:29:14 +05:30
|
|
|
|
2016-09-20 10:38:31 +05:30
|
|
|
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
|
|
|
!> @brief gets the current host name
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
2020-01-04 22:55:59 +05:30
|
|
|
function getHostName()
|
2019-05-09 11:55:56 +05:30
|
|
|
|
2020-01-26 16:49:36 +05:30
|
|
|
character(kind=C_CHAR), dimension(pPathLen) :: charArray ! C string is an array
|
|
|
|
character(len=:), allocatable :: getHostName
|
2019-05-11 01:18:43 +05:30
|
|
|
integer(C_INT) :: stat
|
|
|
|
integer :: i
|
|
|
|
|
|
|
|
call getHostName_C(charArray,stat)
|
2020-01-04 22:55:59 +05:30
|
|
|
|
2019-05-11 01:18:43 +05:30
|
|
|
if (stat /= 0_C_INT) then
|
|
|
|
getHostName = 'Error occured when getting host name'
|
|
|
|
else
|
2020-01-26 16:49:36 +05:30
|
|
|
allocate(character(len=pPathLen)::getHostName)
|
2019-05-11 01:18:43 +05:30
|
|
|
arrayToString: do i=1,len(getHostName)
|
|
|
|
if (charArray(i) /= C_NULL_CHAR) then
|
|
|
|
getHostName(i:i)=charArray(i)
|
|
|
|
else
|
2020-01-04 22:55:59 +05:30
|
|
|
getHostName = getHostName(:i-1)
|
2019-05-11 01:18:43 +05:30
|
|
|
exit
|
|
|
|
endif
|
|
|
|
enddo arrayToString
|
|
|
|
endif
|
2016-09-20 10:38:31 +05:30
|
|
|
|
|
|
|
end function getHostName
|
|
|
|
|
2019-02-11 23:16:14 +05:30
|
|
|
|
2018-05-26 02:52:32 +05:30
|
|
|
!--------------------------------------------------------------------------------------------------
|
|
|
|
!> @brief changes the current working directory
|
|
|
|
!--------------------------------------------------------------------------------------------------
|
|
|
|
logical function setCWD(path)
|
2019-05-09 11:55:56 +05:30
|
|
|
|
2019-05-11 01:18:43 +05:30
|
|
|
character(len=*), intent(in) :: path
|
2020-01-26 16:49:36 +05:30
|
|
|
character(kind=C_CHAR), dimension(pPathLen) :: strFixedLength ! C string is an array
|
2019-05-11 01:18:43 +05:30
|
|
|
integer :: i
|
|
|
|
|
|
|
|
strFixedLength = repeat(C_NULL_CHAR,len(strFixedLength))
|
|
|
|
do i=1,len(path) ! copy array components
|
|
|
|
strFixedLength(i)=path(i:i)
|
|
|
|
enddo
|
|
|
|
setCWD=merge(.True.,.False.,chdir_C(strFixedLength) /= 0_C_INT)
|
2018-05-26 02:52:32 +05:30
|
|
|
|
|
|
|
end function setCWD
|
|
|
|
|
2016-03-12 01:29:14 +05:30
|
|
|
end module system_routines
|
|
|
|
|