DAMASK_EICMD/src/system_routines.f90

307 lines
9.0 KiB
Fortran
Raw Normal View History

2016-05-05 16:30:46 +05:30
!--------------------------------------------------------------------------------------------------
2020-06-26 15:14:17 +05:30
!> @author Martin Diehl, Max-Planck-Institut für Eisenforschung GmbH
!> @brief Wrappers to C routines for system operations
2016-05-05 16:30:46 +05:30
!--------------------------------------------------------------------------------------------------
2016-03-12 01:29:14 +05:30
module system_routines
2019-05-11 01:18:43 +05:30
use, intrinsic :: ISO_C_Binding
use, intrinsic :: ISO_fortran_env
2020-06-26 15:14:17 +05:30
use prec
implicit none(type,external)
private
2020-06-26 15:14:17 +05:30
public :: &
2023-11-25 20:29:00 +05:30
system_routines_init, &
system_routines_selfTest, &
setCWD, &
getCWD, &
getHostName, &
getUserName, &
signalint_C, &
signalusr1_C, &
signalusr2_C, &
isatty, &
f_c_string, &
free_C
2020-01-26 16:49:36 +05:30
2020-06-26 15:14:17 +05:30
interface
2020-06-26 15:14:17 +05:30
function setCWD_C(cwd) bind(C)
use, intrinsic :: ISO_C_Binding, only: C_INT, C_CHAR
2022-02-06 19:50:26 +05:30
2023-12-09 19:49:27 +05:30
implicit none(type,external)
integer(C_INT) :: setCWD_C
character(kind=C_CHAR), dimension(*), intent(in) :: cwd
end function setCWD_C
2020-01-26 16:49:36 +05:30
subroutine getCWD_C(cwd, stat) bind(C)
use, intrinsic :: ISO_C_Binding, only: C_INT, C_CHAR
use prec
2020-06-26 15:14:17 +05:30
2023-12-09 19:49:27 +05:30
implicit none(type,external)
character(kind=C_CHAR), dimension(pPathLen+1), intent(out) :: cwd ! NULL-terminated array
integer(C_INT), intent(out) :: stat
end subroutine getCWD_C
2020-01-26 16:49:36 +05:30
subroutine getHostName_C(hostname, stat) bind(C)
use, intrinsic :: ISO_C_Binding, only: C_INT, C_CHAR
use prec
2020-06-26 15:14:17 +05:30
2023-12-09 19:49:27 +05:30
implicit none(type,external)
2023-06-04 10:47:38 +05:30
character(kind=C_CHAR), dimension(pSTRLEN+1), intent(out) :: hostname ! NULL-terminated array
integer(C_INT), intent(out) :: stat
end subroutine getHostName_C
2020-06-26 15:14:17 +05:30
subroutine getUserName_C(username, stat) bind(C)
use, intrinsic :: ISO_C_Binding, only: C_INT, C_CHAR
use prec
2020-06-26 15:14:17 +05:30
2023-12-09 19:49:27 +05:30
implicit none(type,external)
2023-06-04 10:47:38 +05:30
character(kind=C_CHAR), dimension(pSTRLEN+1), intent(out) :: username ! NULL-terminated array
integer(C_INT), intent(out) :: stat
end subroutine getUserName_C
2020-06-26 15:14:17 +05:30
subroutine signalint_C(handler) bind(C)
use, intrinsic :: ISO_C_Binding, only: C_FUNPTR
2020-06-26 15:14:17 +05:30
2023-12-09 19:49:27 +05:30
implicit none(type,external)
type(C_FUNPTR), intent(in), value :: handler
end subroutine signalint_C
2020-06-26 15:14:17 +05:30
subroutine signalusr1_C(handler) bind(C)
use, intrinsic :: ISO_C_Binding, only: C_FUNPTR
2020-06-26 15:14:17 +05:30
2023-12-09 19:49:27 +05:30
implicit none(type,external)
type(C_FUNPTR), intent(in), value :: handler
end subroutine signalusr1_C
2020-06-26 15:14:17 +05:30
subroutine signalusr2_C(handler) bind(C)
use, intrinsic :: ISO_C_Binding, only: C_FUNPTR
2023-12-09 19:49:27 +05:30
implicit none(type,external)
type(C_FUNPTR), intent(in), value :: handler
end subroutine signalusr2_C
subroutine free_C(ptr) bind(C,name='free')
use, intrinsic :: ISO_C_Binding, only: C_PTR
2020-06-26 15:14:17 +05:30
2023-12-09 19:49:27 +05:30
implicit none(type,external)
type(C_PTR), value :: ptr
end subroutine free_C
2020-06-26 15:14:17 +05:30
function stdout_isatty_C() bind(C)
use, intrinsic :: ISO_C_Binding, only: C_INT
2023-12-09 19:49:27 +05:30
implicit none(type,external)
integer(C_INT) :: stdout_isatty_C
end function stdout_isatty_C
function stderr_isatty_C() bind(C)
use, intrinsic :: ISO_C_Binding, only: C_INT
2023-12-09 19:49:27 +05:30
implicit none(type,external)
integer(C_INT) :: stderr_isatty_C
end function stderr_isatty_C
function stdin_isatty_C() bind(C)
use, intrinsic :: ISO_C_Binding, only: C_INT
implicit none(type,external)
integer(C_INT) :: stdin_isatty_C
end function stdin_isatty_C
end interface
2016-03-12 01:29:14 +05:30
contains
2023-11-25 20:29:00 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief Do self test.
!--------------------------------------------------------------------------------------------------
subroutine system_routines_init()
print'(/,1x,a)', '<<<+- system_routines init -+>>>'; flush(OUTPUT_UNIT)
2023-11-25 20:29:00 +05:30
call system_routines_selfTest()
end subroutine system_routines_init
2016-05-05 16:30:46 +05:30
!--------------------------------------------------------------------------------------------------
2023-02-25 14:37:38 +05:30
!> @brief Set the current working directory.
2016-05-05 16:30:46 +05:30
!--------------------------------------------------------------------------------------------------
logical function setCWD(path)
2019-05-11 01:18:43 +05:30
character(len=*), intent(in) :: path
2016-03-12 01:29:14 +05:30
2021-04-13 20:21:59 +05:30
setCWD = setCWD_C(f_c_string(path)) /= 0_C_INT
2023-11-25 20:29:00 +05:30
call system_routines_selfTest()
end function setCWD
2016-03-12 01:29:14 +05:30
2016-05-05 16:30:46 +05:30
!--------------------------------------------------------------------------------------------------
2023-02-25 14:37:38 +05:30
!> @brief Get the current working directory.
2016-05-05 16:30:46 +05:30
!--------------------------------------------------------------------------------------------------
function getCWD()
character(len=:), allocatable :: getCWD
character(kind=C_CHAR), dimension(pPathLen+1) :: getCWD_Cstring
2019-05-11 01:18:43 +05:30
integer(C_INT) :: stat
2020-06-26 15:14:17 +05:30
2021-04-13 20:21:59 +05:30
call getCWD_C(getCWD_Cstring,stat)
2020-08-09 09:47:14 +05:30
2022-12-07 22:59:03 +05:30
if (stat == 0) then
getCWD = c_f_string(getCWD_Cstring)
else
error stop 'invalid working directory'
2022-06-09 02:36:01 +05:30
end if
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
!--------------------------------------------------------------------------------------------------
2023-02-25 14:37:38 +05:30
!> @brief Get the host name.
!--------------------------------------------------------------------------------------------------
function getHostName()
2019-05-09 11:55:56 +05:30
character(len=:), allocatable :: getHostName
2023-06-04 10:47:38 +05:30
character(kind=C_CHAR), dimension(pSTRLEN+1) :: getHostName_Cstring
2019-05-11 01:18:43 +05:30
integer(C_INT) :: stat
2020-06-26 15:14:17 +05:30
2021-04-13 20:21:59 +05:30
2020-08-09 09:47:14 +05:30
call getHostName_C(getHostName_Cstring,stat)
2022-12-07 22:59:03 +05:30
if (stat == 0) then
getHostName = c_f_string(getHostName_Cstring)
else
getHostName = 'n/a (Error!)'
2022-06-09 02:36:01 +05:30
end if
end function getHostName
2018-05-26 02:52:32 +05:30
!--------------------------------------------------------------------------------------------------
2023-02-25 14:37:38 +05:30
!> @brief Get the user name.
2018-05-26 02:52:32 +05:30
!--------------------------------------------------------------------------------------------------
function getUserName()
2019-05-09 11:55:56 +05:30
character(len=:), allocatable :: getUserName
2020-08-09 09:47:14 +05:30
2023-06-04 10:47:38 +05:30
character(kind=C_CHAR), dimension(pSTRLEN+1) :: getUserName_Cstring
integer(C_INT) :: stat
2020-08-09 09:47:14 +05:30
2021-04-13 20:21:59 +05:30
call getUserName_C(getUserName_Cstring,stat)
2022-12-07 22:59:03 +05:30
if (stat == 0) then
getUserName = c_f_string(getUserName_Cstring)
else
getUserName = 'n/a (Error!)'
2022-02-06 19:50:26 +05:30
end if
end function getUserName
2020-08-09 09:47:14 +05:30
!--------------------------------------------------------------------------------------------------
2022-02-06 19:50:26 +05:30
!> @brief Convert C string to Fortran string.
!> @details: C string is NULL terminated and, hence, longer by one than the Fortran string.
2020-08-09 09:47:14 +05:30
!--------------------------------------------------------------------------------------------------
pure function c_f_string(c_string) result(f_string)
character(kind=C_CHAR), dimension(:), intent(in) :: c_string
character(len=:), allocatable :: f_string
2021-04-13 20:21:59 +05:30
2023-02-10 04:04:45 +05:30
integer(pI64) :: i
2020-08-09 09:47:14 +05:30
2021-04-13 20:21:59 +05:30
2023-02-10 04:04:45 +05:30
allocate(character(len=size(c_string,kind=pI64))::f_string)
arrayToString: do i=1_pI64,len(f_string,pI64)
2020-08-09 09:47:14 +05:30
if (c_string(i) /= C_NULL_CHAR) then
f_string(i:i)=c_string(i)
else
2023-02-10 04:04:45 +05:30
f_string = f_string(:i-1_pI64)
2020-08-09 09:47:14 +05:30
exit
2022-02-06 19:50:26 +05:30
end if
end do arrayToString
2020-08-09 09:47:14 +05:30
end function c_f_string
!--------------------------------------------------------------------------------------------------
2022-02-06 19:50:26 +05:30
!> @brief Convert Fortran string to C string.
!> @details: C string is NULL terminated and, hence, longer by one than the Fortran string.
2020-08-09 09:47:14 +05:30
!--------------------------------------------------------------------------------------------------
pure function f_c_string(f_string) result(c_string)
2023-02-10 04:04:45 +05:30
character(len=*), intent(in) :: f_string
character(kind=C_CHAR), dimension(len_trim(f_string,pI64)+1_pI64) :: c_string
2021-04-13 20:21:59 +05:30
2023-02-10 04:04:45 +05:30
c_string = transfer(trim(f_string)//C_NULL_CHAR,c_string,size=size(c_string,kind=pI64))
2020-08-09 09:47:14 +05:30
end function f_c_string
2018-05-26 02:52:32 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief Test whether a file descriptor refers to a terminal.
!> @detail A terminal is neither a file nor a redirected STDOUT/STDERR/STDIN.
!--------------------------------------------------------------------------------------------------
logical function isatty(unit)
integer, intent(in) :: unit
select case(unit)
#ifndef LOGFILE
case (OUTPUT_UNIT)
isatty = stdout_isatty_C()==1
case (ERROR_UNIT)
isatty = stderr_isatty_C()==1
#endif
case (INPUT_UNIT)
isatty = stdin_isatty_C()==1
case default
isatty = .false.
end select
end function isatty
2023-11-25 20:29:00 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief Check correctness of some system_routine functions.
!--------------------------------------------------------------------------------------------------
subroutine system_routines_selfTest()
real :: r
real, dimension(:), allocatable :: rnd_real
character(len=:), allocatable :: rnd_str
integer :: i
call random_number(r)
allocate(rnd_real(30+int(r*50.)))
call random_number(rnd_real)
allocate(character(size(rnd_real))::rnd_str)
do i = 1, size(rnd_real)
rnd_str(i:i) = char(32 + int(rnd_real(i)*(127.-32.)))
end do
if (c_f_string(f_c_string(rnd_str)) /= rnd_str) error stop 'c_f_string/f_c_string'
end subroutine system_routines_selfTest
2016-03-12 01:29:14 +05:30
end module system_routines