GCC Code Coverage Report


Directory: ./
File: dyn3d_common/conf_planete.f90
Date: 2022-01-11 19:19:34
Exec Total Coverage
Lines: 0 27 0.0%
Branches: 0 0 -%

Line Branch Exec Source
1 !
2 ! $Id$
3 !
4 SUBROUTINE conf_planete
5 !
6 USE IOIPSL
7 USE comconst_mod, ONLY: pi, g, molmass, kappa, cpp, omeg, rad, &
8 year_day, daylen, daysec, ihf
9 USE comvert_mod, ONLY: preff, pa
10 IMPLICIT NONE
11 !
12 !
13 ! Declarations :
14 ! --------------
15
16 !
17 ! local:
18 ! ------
19
20 ! ---------------------------------------------
21 ! Initialisations de constantes de la dynamique
22 ! ---------------------------------------------
23 ! Pi
24 pi=2.*asin(1.)
25
26 !Reference surface pressure (Pa)
27 preff=101325.
28 CALL getin('preff', preff)
29 ! Reference pressure at which hybrid coord. become purely pressure
30 ! pa=50000.
31 pa=preff/2.
32 CALL getin('pa', pa)
33 ! Gravity
34 g=9.80665
35 CALL getin('g',g)
36 ! Molar mass of the atmosphere
37 molmass = 28.9644
38 CALL getin('molmass',molmass)
39 ! kappa=R/Cp et Cp
40 kappa = 2./7.
41 CALL getin('kappa',kappa)
42 cpp=8.3145/molmass/kappa*1000.
43 CALL getin('cpp',cpp)
44 ! Radius of the planet
45 rad = 6371229.
46 CALL getin('radius',rad)
47 ! Length of a standard day (s)
48 daysec=86400.
49 CALL getin('daysec',daysec)
50 ! Rotation rate of the planet:
51 ! Length of a solar day, in standard days
52 daylen = 1.
53 CALL getin('daylen',daylen)
54 ! Number of days (standard) per year:
55 year_day = 365.25
56 CALL getin('year_day',year_day)
57 ! Omega
58 ! omeg=2.*pi/86400.
59 omeg=2.*pi/daysec*(1./daylen+1./year_day)
60 CALL getin('omeg',omeg)
61
62 ! Intrinsic heat flux (default: none) (only used if planet_type="giant")
63 ihf = 0.
64 call getin('ihf',ihf)
65
66 END SUBROUTINE conf_planete
67