GCC Code Coverage Report
Directory: ./ Exec Total Coverage
File: dynphy_lonlat/phylmd/iniphysiq_mod.F90 Lines: 15 17 88.2 %
Date: 2023-06-30 12:51:15 Branches: 2 8 25.0 %

Line Branch Exec Source
1
!
2
! $Id: iniphysiq_mod.F90 4389 2023-01-23 10:28:51Z dcugnet $
3
!
4
MODULE iniphysiq_mod
5
6
CONTAINS
7
8
1
SUBROUTINE iniphysiq(ii,jj,nlayer, &
9
                     nbp, communicator, &
10
                     punjours, pdayref,ptimestep, &
11
                     rlatudyn,rlatvdyn,rlonudyn,rlonvdyn,airedyn,cudyn,cvdyn, &
12
                     prad,pg,pr,pcpp,iflag_phys)
13
  USE dimphy, ONLY: init_dimphy
14
  USE inigeomphy_mod, ONLY: inigeomphy
15
  USE mod_grid_phy_lmdz, ONLY: nbp_lon,nbp_lat,nbp_lev,klon_glo ! number of atmospheric columns (on full grid)
16
  USE mod_phys_lmdz_para, ONLY: klon_omp ! number of columns (on local omp grid)
17
  USE vertical_layers_mod, ONLY : init_vertical_layers
18
  USE infotrac, ONLY: nbtr, type_trac
19
#ifdef CPP_StratAer
20
  USE infotrac_phy, ONLY: nbtr_bin, nbtr_sulgas, id_OCS_strat, &
21
                      id_SO2_strat, id_H2SO4_strat, id_BIN01_strat
22
23
#endif
24
#ifdef REPROBUS
25
  USE CHEM_REP, ONLY : Init_chem_rep_phys
26
#ifdef CPP_PARA
27
  USE parallel_lmdz, ONLY : mpi_size, mpi_rank
28
  USE bands, ONLY : distrib_phys
29
#endif
30
  USE mod_phys_lmdz_omp_data, ONLY: klon_omp
31
#endif
32
  USE control_mod, ONLY: dayref,anneeref,day_step,nday,offline, iphysiq
33
  USE inifis_mod, ONLY: inifis
34
  USE time_phylmdz_mod, ONLY: init_time
35
  USE temps_mod, ONLY: annee_ref, day_ini, day_ref, start_time, calend, year_len
36
  USE infotrac_phy, ONLY: init_infotrac_phy
37
  USE phystokenc_mod, ONLY: init_phystokenc
38
  USE phyaqua_mod, ONLY: iniaqua
39
  USE comconst_mod, ONLY: omeg, rad
40
#ifdef INCA
41
  USE indice_sol_mod, ONLY: nbsrf, is_oce, is_sic, is_ter, is_lic
42
#ifdef CPP_PARA
43
  USE parallel_lmdz, ONLY : mpi_size, mpi_rank
44
  USE bands, ONLY : distrib_phys
45
#endif
46
  USE mod_phys_lmdz_omp_data, ONLY: klon_omp
47
#endif
48
  USE ioipsl_getin_p_mod, ONLY: getin_p
49
  USE slab_heat_transp_mod, ONLY: ini_slab_transp_geom
50
  IMPLICIT NONE
51
52
  ! =======================================================================
53
  ! Initialisation of the physical constants and some positional and
54
  ! geometrical arrays for the physics
55
  ! =======================================================================
56
57
  include "dimensions.h"
58
  include "paramet.h"
59
  include "iniprint.h"
60
  include "tracstoke.h"
61
  include "comgeom.h"
62
63
  REAL, INTENT (IN) :: prad ! radius of the planet (m)
64
  REAL, INTENT (IN) :: pg ! gravitational acceleration (m/s2)
65
  REAL, INTENT (IN) :: pr ! ! reduced gas constant R/mu
66
  REAL, INTENT (IN) :: pcpp ! specific heat Cp
67
  REAL, INTENT (IN) :: punjours ! length (in s) of a standard day
68
  INTEGER, INTENT (IN) :: nlayer ! number of atmospheric layers
69
  INTEGER, INTENT (IN) :: ii ! number of atmospheric columns along longitudes
70
  INTEGER, INTENT (IN) :: jj ! number of atompsheric columns along latitudes
71
  INTEGER, INTENT(IN) :: nbp ! number of physics columns for this MPI process
72
  INTEGER, INTENT(IN) :: communicator ! MPI communicator
73
  REAL, INTENT (IN) :: rlatudyn(jj+1) ! latitudes of the physics grid
74
  REAL, INTENT (IN) :: rlatvdyn(jj) ! latitude boundaries of the physics grid
75
  REAL, INTENT (IN) :: rlonvdyn(ii+1) ! longitudes of the physics grid
76
  REAL, INTENT (IN) :: rlonudyn(ii+1) ! longitude boundaries of the physics grid
77
  REAL, INTENT (IN) :: airedyn(ii+1,jj+1) ! area of the dynamics grid (m2)
78
  REAL, INTENT (IN) :: cudyn((ii+1)*(jj+1)) ! cu coeff. (u_covariant = cu * u)
79
  REAL, INTENT (IN) :: cvdyn((ii+1)*jj) ! cv coeff. (v_covariant = cv * v)
80
  INTEGER, INTENT (IN) :: pdayref ! reference day of for the simulation
81
  REAL, INTENT (IN) :: ptimestep !physics time step (s)
82
  INTEGER, INTENT (IN) :: iflag_phys ! type of physics to be called
83
84
  INTEGER :: ibegin, iend, offset
85
  INTEGER :: i,j,k
86
  CHARACTER (LEN=20) :: modname = 'iniphysiq'
87
  CHARACTER (LEN=80) :: abort_message
88
89
  LOGICAL :: slab_hdiff
90
  INTEGER :: slab_ekman
91
  CHARACTER (LEN = 6) :: type_ocean
92
93
#ifndef CPP_PARA
94
  INTEGER,PARAMETER :: mpi_rank=0
95
  INTEGER, PARAMETER :: mpi_size = 1
96
  INTEGER :: distrib_phys(mpi_rank:mpi_rank)=(jjm-1)*iim+2
97
#endif
98
99
  ! --> initialize physics distribution, global fields and geometry
100
  ! (i.e. things in phy_common or dynphy_lonlat)
101
  CALL inigeomphy(ii,jj,nlayer, &
102
               nbp, communicator, &
103
               rlatudyn,rlatvdyn, &
104
               rlonudyn,rlonvdyn, &
105
1
               airedyn,cudyn,cvdyn)
106
107
  ! --> now initialize things specific to the phylmd physics package
108
109
!!$OMP PARALLEL DEFAULT(SHARED) COPYIN(/temps/)
110
!	Copy all threadprivate variables in temps_mod
111
!$OMP PARALLEL DEFAULT(SHARED) COPYIN(annee_ref,day_ini,day_ref,start_time)
112
113
  ! Initialize physical constants in physics:
114
1
  CALL inifis(punjours,prad,pg,pr,pcpp)
115
116
1
  CALL init_time(annee_ref,day_ref,day_ini,start_time,nday,ptimestep)
117
118
  ! Initialize dimphy module (unless in 1D where it has already been done)
119
!  IF (klon_glo>1) CALL Init_dimphy(klon_omp,nlayer)
120
121
  ! Copy over "offline" settings
122
1
  CALL init_phystokenc(offline,istphy)
123
124
  ! Initialization for slab heat transport
125
1
  type_ocean="force"
126
1
  CALL getin_p('type_ocean',type_ocean)
127
1
  slab_hdiff=.FALSE.
128
1
  CALL getin_p('slab_hdiff',slab_hdiff)
129
1
  slab_ekman=0
130
1
  CALL getin_p('slab_ekman',slab_ekman)
131

1
  IF ((type_ocean=='slab').AND.(slab_hdiff.OR.(slab_ekman.GT.0))) THEN
132
     CALL ini_slab_transp_geom(ip1jm,ip1jmp1,unsairez,fext,unsaire,&
133
                                  cu,cuvsurcv,cv,cvusurcu, &
134
                                  aire,apoln,apols, &
135
                                  aireu,airev,rlatvdyn,rad,omeg)
136
  END IF
137
138
  ! Initialize tracer names, numbers, etc. for physics
139
1
  CALL init_infotrac_phy
140
141
  ! Initializations for Reprobus
142
  IF (type_trac == 'repr') THEN
143
#ifdef REPROBUS
144
    call Init_chem_rep_phys(klon_omp,nlayer)
145
    call init_reprobus_para( &
146
          nbp_lon,nbp_lat,nbp_lev,klon_glo,mpi_size, &
147
          distrib_phys,communicator)
148
#endif
149
  ENDIF
150
!$OMP END PARALLEL
151
152
153
  IF (type_trac == 'repr') THEN
154
#ifdef REPROBUS
155
    call init_reprobus_para( &
156
          nbp_lon,nbp_lat,nbp_lev,klon_glo,mpi_size, &
157
          distrib_phys,communicator)
158
#endif
159
  ENDIF
160
161
!!$OMP PARALLEL DEFAULT(SHARED) COPYIN(/temps/)
162
!$OMP PARALLEL DEFAULT(SHARED)
163
  ! Additional initializations for aquaplanets
164
1
  IF (iflag_phys>=100) THEN
165
    CALL iniaqua(klon_omp,year_len,iflag_phys)
166
  END IF
167
168
  IF (ANY(type_trac == ['inca','inco'])) THEN
169
#ifdef INCA
170
     CALL init_inca_dim_reg(nbp_lon, nbp_lat - 1, &
171
          rlonudyn, rlatudyn, rlonvdyn, rlatvdyn)
172
#endif
173
  END IF
174
175
!$OMP END PARALLEL
176
177
1
END SUBROUTINE iniphysiq
178
179
END MODULE iniphysiq_mod