GCC Code Coverage Report


Directory: ./
File: phy_common/init_print_control_mod.f90
Date: 2022-01-11 19:19:34
Exec Total Coverage
Lines: 15 19 78.9%
Branches: 3 8 37.5%

Line Branch Exec Source
1 MODULE init_print_control_mod
2
3 ! init_print_control to initialize print_control_mod variables
4 ! not included there because of circular dependecy issues
5
6 CONTAINS
7
8 1 SUBROUTINE init_print_control
9 USE print_control_mod, ONLY : set_print_control
10 USE ioipsl_getin_p_mod, ONLY : getin_p
11 USE mod_phys_lmdz_para, ONLY: is_omp_root, is_master
12 IMPLICIT NONE
13
14 INTEGER :: lunout ! default output file identifier (6==screen)
15 INTEGER :: prt_level ! Output level
16 LOGICAL :: debug ! flag to specify if in "debug mode"
17 LOGICAL :: opened
18 INTEGER :: number
19
20 !Config Key = prt_level
21 !Config Desc = niveau d'impressions de débogage
22 !Config Def = 0
23 !Config Help = Niveau d'impression pour le débogage
24 !Config (0 = minimum d'impression)
25 1 prt_level = 0
26 1 CALL getin_p('prt_level',prt_level)
27
28 !Config Key = lunout
29 !Config Desc = unite de fichier pour les impressions
30 !Config Def = 6
31 !Config Help = unite de fichier pour les impressions
32 !Config (defaut sortie standard = 6)
33 1 lunout=6
34 1 CALL getin_p('lunout', lunout)
35
36
1/2
✓ Branch 0 taken 1 times.
✗ Branch 1 not taken.
1 IF (is_omp_root) THEN
37
1/2
✗ Branch 0 not taken.
✓ Branch 1 taken 1 times.
1 IF (lunout /= 5 .and. lunout /= 6) THEN
38 INQUIRE(FILE='lmdz.out_0000',OPENED=opened,NUMBER=number)
39 IF (opened) THEN
40 lunout=number
41 ELSE
42 OPEN(UNIT=lunout,FILE='lmdz.out_0000',ACTION='write', &
43 STATUS='unknown',FORM='formatted')
44 ENDIF
45 ENDIF
46 ENDIF
47
48 !Config Key = debug
49 !Config Desc = mode debogage
50 !Config Def = false
51 !Config Help = positionne le mode debogage
52
53 1 debug = .FALSE.
54 1 CALL getin_p('debug',debug)
55
56
1/2
✓ Branch 0 taken 1 times.
✗ Branch 1 not taken.
1 IF (is_master) THEN
57 1 WRITE(lunout,*)"init_print_control: prt_level=",prt_level
58 1 WRITE(lunout,*)"init_print_control: lunout=",lunout
59 1 WRITE(lunout,*)"init_print_control: debug=",debug
60 ENDIF
61
62 1 CALL set_print_control(lunout,prt_level,debug)
63
64 1 END SUBROUTINE init_print_control
65
66 END MODULE init_print_control_mod
67
68