GCC Code Coverage Report


Directory: ./
File: phys/phys_cal_mod.f90
Date: 2022-01-11 19:19:34
Exec Total Coverage
Lines: 21 26 80.8%
Branches: 2 10 20.0%

Line Branch Exec Source
1 ! $Id: phys_cal_mod.F90 3452 2019-01-28 09:45:20Z fairhead $
2 MODULE phys_cal_mod
3 ! This module contains information on the calendar at the current time step
4
5 INTEGER,SAVE :: year_cur ! current year
6 !$OMP THREADPRIVATE(year_cur)
7 INTEGER,SAVE :: mth_cur ! current month
8 !$OMP THREADPRIVATE(mth_cur)
9 INTEGER,SAVE :: day_cur ! current day
10 !$OMP THREADPRIVATE(day_cur)
11 INTEGER,SAVE :: days_elapsed ! number of whole days since start of the current year
12 !$OMP THREADPRIVATE(days_elapsed)
13 INTEGER,SAVE :: mth_len ! number of days in the current month
14 !$OMP THREADPRIVATE(mth_len)
15 INTEGER,SAVE :: year_len ! number of days in the current year
16 !$OMP THREADPRIVATE(year_len)
17 REAL,SAVE :: hour ! seconds elapsed (in the current day) since midnight
18 !$OMP THREADPRIVATE(hour)
19 REAL,SAVE :: jD_1jan
20 !$OMP THREADPRIVATE(jD_1jan)
21 REAL,SAVE :: jH_1jan
22 !$OMP THREADPRIVATE(jH_1jan)
23 REAL,SAVE :: xjour
24 !$OMP THREADPRIVATE(xjour)
25 REAL,SAVE :: jD_cur ! jour courant a l'appel de la physique (jour julien)
26 !$OMP THREADPRIVATE(jD_cur)
27 REAL,SAVE :: jH_cur ! heure courante a l'appel de la physique (jour julien)
28 !$OMP THREADPRIVATE(jH_cur)
29 REAL,SAVE :: jD_ref ! jour du demarage de la simulation (jour julien)
30 !$OMP THREADPRIVATE(jD_ref)
31 CHARACTER (len=10) :: calend ! type of calendar to use
32 ! (can be earth_360d, earth_365d or earth_366d)
33 !$OMP THREADPRIVATE(calend)
34
35 CONTAINS
36
37 1 SUBROUTINE phys_cal_init(annee_ref,day_ref)
38
39 USE IOIPSL, ONLY: ymds2ju, ioconf_calendar
40 USE mod_phys_lmdz_para, ONLY: is_master,is_omp_master
41 USE ioipsl_getin_p_mod, ONLY: getin_p
42
43 IMPLICIT NONE
44 INTEGER,INTENT(IN) :: annee_ref
45 INTEGER,INTENT(IN) :: day_ref
46
47 ! Find out which type of calendar we are using
48 1 calend = 'earth_360d' ! default
49 1 CALL getin_p("calend",calend)
50
51
1/2
✓ Branch 0 taken 1 times.
✗ Branch 1 not taken.
1 IF (is_omp_master) THEN
52
1/2
✓ Branch 0 taken 1 times.
✗ Branch 1 not taken.
1 IF (calend == 'earth_360d') THEN
53 1 CALL ioconf_calendar('360d')
54 ELSE IF (calend == 'earth_365d') THEN
55 CALL ioconf_calendar('noleap')
56 ELSE IF (calend == 'earth_366d' .OR. calend == 'gregorian') THEN
57 CALL ioconf_calendar('gregorian')
58 ELSE
59 CALL abort_physic('phys_cal_init','Mauvais choix de calendrier',1)
60 ENDIF
61 ENDIF
62 !$OMP BARRIER
63
64 1 CALL ymds2ju(annee_ref, 1, day_ref, 0., jD_ref)
65 1 jD_ref=INT(jD_ref)
66
67 1 END SUBROUTINE phys_cal_init
68
69 480 SUBROUTINE phys_cal_update(julian_date)
70 ! This subroutine updates the module saved variables.
71
72 USE IOIPSL, only: ju2ymds, ymds2ju, ioget_mon_len, ioget_year_len
73 IMPLICIT NONE
74 REAL, INTENT(IN) :: julian_date
75
76 480 jD_cur=INT(julian_date)
77 480 jH_cur=julian_date-jD_cur
78
79 480 CALL ju2ymds(jD_cur+jH_cur, year_cur, mth_cur, day_cur, hour)
80 480 CALL ymds2ju(year_cur, 1, 1, 0., jD_1jan)
81
82 480 jH_1jan = jD_1jan - int (jD_1jan)
83 480 jD_1jan = int (jD_1jan)
84 480 xjour = jD_cur - jD_1jan
85 480 days_elapsed = jD_cur - jD_1jan
86
87 ! Get lenght of current month
88 480 mth_len = ioget_mon_len(year_cur,mth_cur)
89
90 ! Get length of current year
91 480 year_len = ioget_year_len(year_cur)
92
93 480 END SUBROUTINE phys_cal_update
94
95 END MODULE phys_cal_mod
96