GCC Code Coverage Report


Directory: ./
File: rad/suphmf.f90
Date: 2022-01-11 19:19:34
Exec Total Coverage
Lines: 20 20 100.0%
Branches: 2 4 50.0%

Line Branch Exec Source
1 !OPTIONS XOPT(NOEVAL)
2 1 SUBROUTINE SUPHMF(KULOUT)
3
4 !**** *SUPHMF* - Calls initialization of commons controlling physics
5 ! in the Meteo-France version.
6
7 ! Purpose.
8 ! --------
9 ! Organise the setup of physical constants for Meteo-France
10 ! physics package.
11
12 !** Interface.
13 ! ----------
14 ! *CALL* *SUPHMF(KULOUT)
15
16 ! Explicit arguments :
17 ! --------------------
18 ! KULOUT : Logical unit for the output
19
20 ! Implicit arguments :
21 ! --------------------
22 ! None.
23
24 ! Method.
25 ! -------
26 ! Irrelevant.
27
28 ! Externals.
29 ! ----------
30
31 ! SUPHY0
32 ! SUPHY1
33 ! SUPHY2
34 ! SUPHY3
35 ! SUTOPH
36
37 ! Reference.
38 ! ----------
39
40 ! Author.
41 ! -------
42 ! J.-F. Geleyn.
43
44 ! Modifications.
45 ! --------------
46 ! Original : 91-06-15
47 ! Modified 91-06-10 by A. Lasserre-Bigorry (call to SUTOPH)
48 ! Modified 99-03-01 by D. Giard (call to VAL923 for 923 and 927)
49 ! Modified 01-04-02 R. El Khatib setup for CAPE diagnostic
50 ! M.Hamrud 01-Oct-2003 CY28 Cleaning
51 ! Modified 04-11-16 Y. Seity : call suphmnh for AROME physics
52 ! R. Zaaboul 28-Feb-2006: call suparar, suphmpa and suphmse (ex suphmnh)
53 ! Y. Seity 06-07-10: nfpsurfex and lfpart2 in call suphmse (prepsurfex)
54 ! ------------------------------------------------------------------
55
56 !* 1. Call routines for specific physics' commons setup.
57 ! --------------------------------------------------
58
59 USE PARKIND1 ,ONLY : JPIM ,JPRB
60 USE YOMHOOK ,ONLY : LHOOK, DR_HOOK
61
62 USE YOMPHY , ONLY : LSOLV
63 USE YOMARPHY , ONLY : LMPA, LMSE
64 USE YOMCT0 , ONLY : LSFORC, LFPART2
65 USE YOMFPC , ONLY : NFPSURFEX
66
67 ! Ce qui concerne NULNAM et JPNULNAM commente par MPL le 15.04.09
68 !USE PARDIM , ONLY : JPNULNAM
69 !USE YOMLUN , ONLY : NULNAM
70
71 IMPLICIT NONE
72
73 INTEGER(KIND=JPIM),INTENT(IN) :: KULOUT
74 REAL(KIND=JPRB) :: ZHOOK_HANDLE
75
76 INTERFACE
77 SUBROUTINE SUCAPE(KULOUT)
78 USE PARKIND1 ,ONLY : JPIM ,JPRB
79 INTEGER(KIND=JPIM),INTENT(IN) :: KULOUT
80 END SUBROUTINE SUCAPE
81 END INTERFACE
82 INTERFACE
83 SUBROUTINE SU0PHY(KULOUT)
84 USE PARKIND1 ,ONLY : JPIM ,JPRB
85 INTEGER(KIND=JPIM),INTENT(IN) :: KULOUT
86 END SUBROUTINE SU0PHY
87 END INTERFACE
88 INTERFACE
89 SUBROUTINE SUPHY0(KULOUT)
90 USE PARKIND1 ,ONLY : JPIM ,JPRB
91 INTEGER(KIND=JPIM),INTENT(IN) :: KULOUT
92 END SUBROUTINE SUPHY0
93 END INTERFACE
94 INTERFACE
95 SUBROUTINE SUPHY1(KULOUT)
96 USE PARKIND1 ,ONLY : JPIM ,JPRB
97 INTEGER(KIND=JPIM),INTENT(IN) :: KULOUT
98 END SUBROUTINE SUPHY1
99 END INTERFACE
100 INTERFACE
101 SUBROUTINE SUPHY2(KULOUT)
102 USE PARKIND1 ,ONLY : JPIM ,JPRB
103 INTEGER(KIND=JPIM),INTENT(IN) :: KULOUT
104 END SUBROUTINE SUPHY2
105 END INTERFACE
106 INTERFACE
107 SUBROUTINE SUPHY3(KULOUT)
108 USE PARKIND1 ,ONLY : JPIM ,JPRB
109 INTEGER(KIND=JPIM),INTENT(IN) :: KULOUT
110 END SUBROUTINE SUPHY3
111 END INTERFACE
112 INTERFACE
113 SUBROUTINE SUTOPH(KULOUT)
114 USE PARKIND1 ,ONLY : JPIM ,JPRB
115 INTEGER(KIND=JPIM),INTENT(IN) :: KULOUT
116 END SUBROUTINE SUTOPH
117 END INTERFACE
118 INTERFACE
119 SUBROUTINE VAL923(LDNEW)
120 LOGICAL ,INTENT(IN) :: LDNEW
121 END SUBROUTINE VAL923
122 END INTERFACE
123 ! commente par MPL 20.11.08
124 !#include "suparar.intfb.h"
125 !#include "suphmpa.intfb.h"
126 !#include "suphmse.intfb.h"
127
128 ! Ce qui concerne MNAM commente par MPL le 15.04.09
129 !NULNAM = JPNULNAM
130 !OPEN(NULNAM,ACTION="READ")
131 !OPEN(NULNAM,FILE='MNAM',ACTION="READ")
132
133
1/2
✓ Branch 0 taken 1 times.
✗ Branch 1 not taken.
1 IF (LHOOK) CALL DR_HOOK('SUPHMF',0,ZHOOK_HANDLE)
134 1 print *,'SUPHMF: avant SU0PHY'
135 1 CALL SU0PHY(KULOUT)
136 1 print *,'SUPHMF: avant SUPHY0'
137 1 CALL SUPHY0(KULOUT)
138 1 print *,'SUPHMF: avant SUPHY1'
139 1 CALL SUPHY1(KULOUT)
140 1 print *,'SUPHMF: avant SUPHY2'
141 1 CALL SUPHY2(KULOUT)
142 1 print *,'SUPHMF: avant SUPHY3'
143 1 CALL SUPHY3(KULOUT)
144 1 print *,'SUPHMF: avant SUTOPH'
145 1 CALL SUTOPH(KULOUT)
146 1 print *,'SUPHMF: avant VAL923'
147
148 1 CALL VAL923(LSOLV)
149
150 1 print *,'SUPHMF: avant SUCAPE'
151 1 CALL SUCAPE(KULOUT)
152
153 ! setup for AROME physics and SURFEX
154 ! commente par MPL 20.11.08
155 !CALL SUPARAR(KULOUT)
156 !IF (LMPA) CALL SUPHMPA(KULOUT)
157 !IF (LMSE.AND.NFPSURFEX==0.AND.(.NOT.LFPART2)) CALL SUPHMSE(KULOUT)
158
159 ! ------------------------------------------------------------------
160
161
162 ! Ce qui concerne NULNAM commente par MPL le 15.04.09
163 !CLOSE(NULNAM)
164
1/2
✓ Branch 0 taken 1 times.
✗ Branch 1 not taken.
1 IF (LHOOK) CALL DR_HOOK('SUPHMF',1,ZHOOK_HANDLE)
165 1 END SUBROUTINE SUPHMF
166