GCC Code Coverage Report


Directory: ./
File: dyn/getparam.f90
Date: 2022-01-11 19:19:34
Exec Total Coverage
Lines: 0 28 0.0%
Branches: 0 0 -%

Line Branch Exec Source
1 !
2 ! $Id: getparam.F90 2094 2014-07-16 16:55:47Z lguez $
3 !
4 MODULE getparam
5 USE IOIPSL
6
7 INTERFACE getpar
8 MODULE PROCEDURE getparamr,getparami,getparaml
9 END INTERFACE
10 private getparamr,getparami,getparaml
11
12 INTEGER, PARAMETER :: out_eff=99
13
14 CONTAINS
15 SUBROUTINE ini_getparam(fichier)
16 !
17 IMPLICIT NONE
18 !
19 CHARACTER*(*) :: fichier
20 open(out_eff,file=fichier,status='unknown',form='formatted')
21 END SUBROUTINE ini_getparam
22
23 SUBROUTINE fin_getparam
24 !
25 IMPLICIT NONE
26 !
27 close(out_eff)
28
29 END SUBROUTINE fin_getparam
30
31 SUBROUTINE getparamr(TARGET,def_val,ret_val,comment)
32 !
33 IMPLICIT NONE
34 !
35 ! Get a real scalar. We first check if we find it
36 ! in the database and if not we get it from the run.def
37 !
38 ! getinr1d and getinr2d are written on the same pattern
39 !
40 CHARACTER*(*) :: TARGET
41 REAL :: def_val
42 REAL :: ret_val
43 CHARACTER*(*) :: comment
44
45 ret_val=def_val
46 call getin(TARGET,ret_val)
47
48 write(out_eff,*) '######################################'
49 write(out_eff,*) '#### ',comment,' #####'
50 write(out_eff,*) TARGET,'=',ret_val
51
52 END SUBROUTINE getparamr
53
54 SUBROUTINE getparami(TARGET,def_val,ret_val,comment)
55 !
56 IMPLICIT NONE
57 !
58 ! Get a real scalar. We first check if we find it
59 ! in the database and if not we get it from the run.def
60 !
61 ! getinr1d and getinr2d are written on the same pattern
62 !
63 CHARACTER*(*) :: TARGET
64 INTEGER :: def_val
65 INTEGER :: ret_val
66 CHARACTER*(*) :: comment
67
68 ret_val=def_val
69 call getin(TARGET,ret_val)
70
71 write(out_eff,*) '######################################'
72 write(out_eff,*) '#### ',comment,' #####'
73 write(out_eff,*) comment
74 write(out_eff,*) TARGET,'=',ret_val
75
76 END SUBROUTINE getparami
77
78 SUBROUTINE getparaml(TARGET,def_val,ret_val,comment)
79 !
80 IMPLICIT NONE
81 !
82 ! Get a real scalar. We first check if we find it
83 ! in the database and if not we get it from the run.def
84 !
85 ! getinr1d and getinr2d are written on the same pattern
86 !
87 CHARACTER*(*) :: TARGET
88 LOGICAL :: def_val
89 LOGICAL :: ret_val
90 CHARACTER*(*) :: comment
91
92 ret_val=def_val
93 call getin(TARGET,ret_val)
94
95 write(out_eff,*) '######################################'
96 write(out_eff,*) '#### ',comment,' #####'
97 write(out_eff,*) TARGET,'=',ret_val
98
99 END SUBROUTINE getparaml
100
101
102 END MODULE getparam
103