Newer
Older
!MNH_LIC Copyright 1994-2014 CNRS, Meteo-France and Universite Paul Sabatier
!MNH_LIC This is part of the Meso-NH software governed by the CeCILL-C licence
!MNH_LIC version 1. See LICENSE, CeCILL-C_V1-en.txt and CeCILL-C_V1-fr.txt
!MNH_LIC for details. version 1.
!-----------------------------------------------------------------
! #######################
MODULE MODI_INI_MODEL_n
! #######################
!
INTERFACE
!
SUBROUTINE INI_MODEL_n(KMI,HLUOUT,HINIFILE,HINIFILEPGD)
!
INTEGER, INTENT(IN) :: KMI ! Model index
CHARACTER (LEN=*), INTENT(IN) :: HLUOUT ! name for output-listing
! of nested models
CHARACTER (LEN=28), INTENT(IN) :: HINIFILE ! name of
CHARACTER (LEN=28), INTENT(IN) :: HINIFILEPGD
!
END SUBROUTINE INI_MODEL_n
!
END INTERFACE
!
END MODULE MODI_INI_MODEL_n
! ######################################################
SUBROUTINE INI_MODEL_n(KMI,HLUOUT,HINIFILE,HINIFILEPGD)
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
103
104
105
106
107
108
109
110
111
112
113
114
115
116
117
118
119
120
121
122
123
124
125
126
127
128
129
130
131
132
133
134
135
136
137
138
139
140
141
142
143
144
145
146
147
148
149
150
151
152
153
154
155
156
157
158
159
160
161
162
163
164
165
166
167
168
169
170
171
172
173
174
175
176
177
178
179
180
181
182
183
184
185
186
187
188
189
190
191
192
193
194
195
196
197
198
199
200
! ######################################################
!
!!**** *INI_MODEL_n* - routine to initialize the nested model _n
!!
!! PURPOSE
!! -------
! The purpose of this routine is to initialize the variables
! of the nested model _n.
!
!!** METHOD
!! ------
!! The initialization of the model _n is performed as follows :
!! - Memory for arrays are then allocated :
!! * If turbulence kinetic energy variable is not needed
!! (CTURB='NONE'), XTKET, XTKEM and XTKES are zero-size arrays.
!! * If dissipation of TKE variable is not needed
!! (CTURBLEN /='KEPS'), XEPST, XEPSM and XREPSS are zero-size arrays.
!! * Memory for mixing ratio arrays is allocated according to the
!! value of logicals LUSERn (the number NRR of moist variables is deduced).
!! * The latitude (XLAT), longitude (XLON) and map factor (XMAP)
!! arrays are zero-size arrays if Cartesian geometry (LCARTESIAN=.TRUE.)
!! * Memory for reference state without orography ( XRHODREFZ and
!! XTHVREFZ) is only allocated in INI_MODEL1
!! * The horizontal Coriolis parameters (XCORIOX and XCORIOY) arrays
!! are zero-size arrays if thinshell approximation (LTHINSHELL=.TRUE.)
!! * The Curvature coefficients (XCURVX and XCURVY) arrays
!! are zero-size arrays if Cartesian geometry (LCARTESIAN=.TRUE.)
!! * Memory for the Jacobian (ZJ) local array is allocated
!! (This variable is computed in SET_GRID and used in SET_REF).
!! - The spatial and temporal grid variables are initialized by SET_GRID.
!! - The metric coefficients are computed by METRICS (they are using in
!! the SET-REF call).
!! - The prognostic variables and are read in initial
!! LFIFM file (in READ_FIELD)
!! - The reference state variables are initialized by SET_REF.
!! - The temporal indexes of the outputs are computed by SET_OUTPUT_TIMES
!! - The large scale sources are computed in case of coupling case by
!! INI_CPL.
!! - The initialization of the parameters needed for the dynamics
!! of the model n is realized in INI_DYNAMICS.
!! - Then the initial file (DESFM+LFIFM files) is closed by FMCLOS.
!! - The initialization of the parameters needed for the ECMWF radiation
!! code is realized in INI_RADIATIONS.
!! - The contents of the scalar variables are overwritten by
!! the chemistry initialization subroutine CH_INIT_FIELDn when
!! the flags LUSECHEM and LCH_INIT_FIELD are set to TRUE.
!! This allows easy initialization of the chemical fields at a
!! restart of the model.
!!
!! EXTERNAL
!! --------
!! FMLOOK : to retrieve a logical unit number associated with a file
!! FMREAD : to read a LFIFM file
!! FMFREE : to release a logical unit number
!! SET_DIM : to initialize dimensions
!! SET_GRID : to initialize grid
!! METRICS : to compute metric coefficients
!! READ_FIELD : to initialize field
!! FMCLOS : to close a FM-file
!! SET_REF : to initialize reference state for anelastic approximation
!! INI_DYNAMICS: to initialize parameters for the dynamics
!! INI_TKE_EPS : to initialize the TKE
!! SET_DIRCOS : to compute the director cosinus of the orography
!! INI_RADIATIONS : to initialize radiation computations
!! CH_INIT_CCS: to initialize the chemical core system
!! CH_INIT_FIELDn: to (re)initialize the scalar variables
!! INI_DEEP_CONVECTION : to initialize the deep convection scheme
!! CLEANLIST_ll : deaalocate a list
!!
!! IMPLICIT ARGUMENTS
!! ------------------
!!
!! Module MODD_PARAMETERS : contains declaration of parameter variables
!! JPHEXT : Horizontal external points number
!! JPVEXT : Vertical external points number
!!
!! Module MODD_MODD_DYN : contains declaration of parameters
!! for the dynamics
!! Module MODD_CONF : contains declaration of configuration variables
!! for all models
!! NMODEL : Number of nested models
!! NVERB : Level of informations on output-listing
!! 0 for minimum prints
!! 5 for intermediate level of prints
!! 10 for maximum prints
!!
!! Module MODD_REF : contains declaration of reference state
!! variables for all models
!! Module MODD_FIELD_n : contains declaration of prognostic fields
!! Module MODD_LSFIELD_n : contains declaration of Larger Scale fields
!! Module MODD_GRID_n : contains declaration of spatial grid variables
!! Module MODD_TIME_n : contains declaration of temporal grid variables
!! Module MODD_REF_n : contains declaration of reference state
!! variables
!! Module MODD_CURVCOR_n : contains declaration of curvature and Coriolis
!! variables
!! Module MODD_BUDGET : contains declarations of the budget parameters
!! Module MODD_RADIATIONS_n:contains declaration of the variables of the
!! radiation interface scheme
!! Module MODD_STAND_ATM : contains declaration of the 5 standard
!! atmospheres used for the ECMWF-radiation code
!! Module MODD_FRC : contains declaration of the control variables
!! and of the forcing fields
!! Module MODD_CH_MNHC_n : contains the control parameters for chemistry
!! Module MODD_DEEP_CONVECTION_n: contains declaration of the variables of
!! the deep convection scheme
!!
!!
!!
!!
!! Module MODN_CONF_n : contains declaration of namelist NAM_CONFn and
!! uses module MODD_CONF_n (configuration variables)
!! Module MODN_LUNIT_n : contains declaration of namelist NAM_LUNITn and
!! uses module MODD_LUNIT_n (Logical units)
!! Module MODN_DYN_n : contains declaration of namelist NAM_DYNn and
!! uses module MODD_DYN_n (control of dynamics)
!! Module MODN_PARAM_n : contains declaration of namelist NAM_PARAMn and
!! uses module MODD_PARAM_n (control of physical
!! parameterization)
!! Module MODN_LBC_n : contains declaration of namelist NAM_LBCn and
!! uses module MODD_LBC_n (lateral boundaries)
!! Module MODN_TURB_n : contains declaration of namelist NAM_TURBn and
!! uses module MODD_TURB_n (turbulence scheme)
!! Module MODN_PARAM_RAD_n: contains declaration of namelist NAM_PARAM_RADn
!!
!! REFERENCE
!! ---------
!! Book2 of documentation (routine INI_MODEL_n)
!!
!!
!! AUTHOR
!! ------
!! V. Ducrocq * Meteo France *
!!
!! MODIFICATIONS
!! -------------
!! Original 10/06/94
!! Modification 17/10/94 (Stein) For LCORIO
!! Modification 20/10/94 (Stein) For SET_GRID and NAMOUTN
!! Modification 26/10/94 (Stein) Modifications of the namelist names
!! Modification 10/11/94 (Lafore) allocatation of tke fields
!! Modification 22/11/94 (Stein) change the READ_FIELDS call ( add
!! pressure function
!! Modification 06/12/94 (Stein) add the LS fields
!! 12/12/94 (Stein) rename END_INI in INI_DYNAMICS
!! Modification 09/01/95 (Stein) add the turbulence scheme
!! Modification Jan 19, 1995 (J. Cuxart) add the TKE initialization
!! Jan 23, 1995 (J. Stein ) remove the condition
!! LTHINSHELL=T LCARTESIAN=T => stop
!! Modification Feb 16, 1995 (I.Mallet) add the METRICS call and
!! change the SET_REF call (add
!! the lineic mass)
!! Modification Mar 10, 1995 (I. Mallet) add the COUPLING initialization
!! June 29,1995 (Ph. Hereil, J. Stein) add the budget init.
!! Modification Sept. 1, 1995 (S. Belair) Reading of the surface variables
!! and parameters for ISBA (i.e., add a
!! CALL READ_GR_FIELD)
!! Modification 18/08/95 (J.P.Lafore) time step change case
!! 25/09/95 (J. Cuxart and J.Stein) add LES variables
!! and the diachronic file initialization
!! Modification Sept 20,1995 (Lafore) coupling for the dry mass Md
!! Modification Sept. 12, 1995 (J.-P. Pinty) add the initialization of
!! the ECMWF radiation code
!! Modification Sept. 13, 1995 (J.-P. Pinty) control the allocation of the
!! arrays of MODD_GR_FIELD_n
!! Modification Nove. 17, 1995 (J.Stein) control of the control !!
!! March 01, 1996 (J. Stein) add the cloud fraction
!! April 03, 1996 (J. Stein) unify the ISBA and TSZ0 cases
!! Modification 13/12/95 (M. Georgelin) add the forcing variables in
!! the call read_field, and their
!! allocation.
!! Mai 23, 1996 (J. Stein) allocate XSEA in the TSZ0 case
!! June 11, 1996 (V. Masson) add XSILT and XLAKE of
201
202
203
204
205
206
207
208
209
210
211
212
213
214
215
216
217
218
219
220
221
222
223
224
225
226
227
228
229
230
231
232
233
234
235
236
237
238
239
240
241
242
243
244
245
246
247
248
249
250
251
252
253
254
255
256
257
258
259
!! MODD_GR_FIELD_n
!! August 7, 1996 (K. Suhre) add (re)initialization of
!! chemistry
!! Octo. 11, 1996 (J. Stein ) add XSRCT and XSRCM
!! October 8, 1996 (J. Cuxart, E. Sanchez) Moist LES diagnostics
!! and control on TKE initialization.
!! Modification 19/12/96 (J.-P. Pinty) add the ice parameterization and
!! the precipitation fields
!! Modification 11/01/97 (J.-P. Pinty) add the deep convection
!! Nov. 1, 1996 (V. Masson) Read the vertical grid kind
!! Nov. 20, 1996 (V. Masson) control of convection calling time
!! July 16, 1996 (J.P.Lafore) update of EXSEG file reading
!! Oct. 08, 1996 (J.P.Lafore, V.Masson)
!! MY_NAME and DAD_NAME reading and check
!! Oct. 30, 1996 (J.P.Lafore) resolution ratio reading for nesting
!! and Bikhardt interpolation coef. initialization
!! Nov. 22, 1996 (J.P.Lafore) allocation of LS sources for nesting
!! Feb. 26, 1997 (J.P.Lafore) allocation of "surfacic" LS fields
!! March 10, 1997 (J.P.Lafore) forcing only for model 1
!! June 22, 1997 (J. Stein) add the absolute pressure
!! July 09, 1997 (V. Masson) add directional z0 and SSO
!! Aug. 18, 1997 (V. Masson) consistency between storage
!! type and CCONF
!! Dec. 22, 1997 (J. Stein) add the LS field spawning
!! Jan. 24, 1998 (P.Bechtold) change MODD_FRC and MODD_DEEP_CONVECTION
!! Dec. 24, 1997 (V.Masson) directional z0 parameters
!! Aug. 13, 1998 (V. Ducrocq P Jabouille) //
!! Mai. 26, 1998 (J. Stein) remove NXEND,NYEND
!! Feb. 1, 1999 (J. Stein) compute the Bikhardt
!! interpolation coeff. before the call to set_grid
!! April 5, 1999 (V. Ducrocq) change the DXRATIO_ALL init.
!! April 12, 1999 (J. Stein) cleaning + INI_SPAWN_LS
!! Apr. 7, 1999 (P Jabouille) store the metric coefficients
!! in modd_metrics_n
!! Jui. 15,1999 (P Jabouille) split the routines in two parts
!! Jan. 04,2000 (V. Masson) removes the TSZ0 case
!! Apr. 15,2000 (P Jabouille) parallelization of grid nesting
!! Aug. 20,2000 (J Stein ) tranpose XBFY
!! Jui 01,2000 (F.solmon ) adapatation for patch approach
!! Jun. 15,2000 (J.-P. Pinty) add C2R2 initialization
!! Nov. 15,2000 (V.Masson) use of ini_modeln in prep_real_case
!! Nov. 15,2000 (V.Masson) call of LES routines
!! Nov. 15,2000 (V.Masson) aircraft and balloon initialization routines
!! Jan. 22,2001 (D.Gazen) update_nsv set NSV_* var. for current model
!! Mar. 04,2002 (V.Ducrocq) initialization to temporal series
!! Mar. 15,2002 (F.Solmon) modification of ini_radiation interface
!! Nov. 29,2002 (JP Pinty) add C3R5, ICE2, ICE4, ELEC
!! Jan. 2004 (V.Masson) externalization of surface
!! May 2006 Remove KEPS
!! Apr. 2010 (M. Leriche) add pH for aqueous phase chemistry
!! Jul. 2010 (M. Leriche) add Ice phase chemistry
!! Oct. 2010 (J.Escobar) check if local domain not to small for NRIMX NRIMY
!! Nov. 2010 (J.Escobar) PGI BUG , add SIZE(CSV) to init_ground routine
!! Nov. 2009 (C. Barthe) add call to INI_ELEC_n
!! Mar. 2010 (M. Chong) add small ions
!! Apr. 2011 (M. Chong) correction of RESTART (ELEC)
!! June 2011 (B.Aouizerats) Prognostic aerosols
!! June 2011 (P.Aumond) Drag of the vegetation
!! + Mean fields
!! July 2013 (Bosseur & Filippi) Adds Forefire
!! P. Tulet Nov 2014 accumulated moles of aqueous species that fall at the surface
!! JAn. 2015 (F. Brosse) bug in allocate XACPRAQ
!! Dec 2014 (C.Lac) : For reproducibility START/RESTA
!! J.Escobar : 15/09/2015 : WENO5 & JPHEXT <> 1
!! V. Masson Feb 2015 replaces, for aerosols, cover fractions by sea, town, bare soil fractions

ESCOBAR MUNOZ Juan
committed
!! J.Escobar : 19/04/2016 : Pb IOZ/NETCDF , missing OPARALLELIO=.FALSE. for PGD files

Juan Escobar
committed
!! J.Escobar : 01/06/2016 : correct check limit of NRIM versus local subdomain size IDIM
!! 06/2016 (G.Delautier) phasage surfex 8
!! Modification 01/2016 (JP Pinty) Add LIMA
!! 10/2016 M.Mazoyer New KHKO output fields
!! 10/2016 (C.Lac) Add max values

Gaelle DELAUTIER
committed
!! F. Brosse Oct. 2016 add prod/loss terms computation for chemistry
274
275
276
277
278
279
280
281
282
283
284
285
286
287
288
289
290
291
292
293
294
295
296
297
298
299
300
301
302
303
!---------------------------------------------------------------------------------
!
!* 0. DECLARATIONS
! ------------
USE MODE_ll
USE MODD_ARGSLIST_ll, ONLY : LIST_ll
USE MODE_IO_ll
USE MODE_FM
USE MODE_FMREAD
USE MODE_TYPE_ZDIFFU
!
USE MODD_NSV
USE MODD_PARAMETERS
USE MODD_CST
USE MODD_CONF
USE MODD_DUST
USE MODD_DYN
USE MODD_DYNZD
USE MODD_FRC
USE MODD_REF
USE MODD_SERIES, ONLY: LSERIES
USE MODD_TIME
USE MODD_TURB_CLOUD, ONLY: NMODEL_CLOUD, CTURBLEN_CLOUD,XCEI
USE MODD_NESTING
USE MODD_PASPOL
USE MODD_DRAGTREE
USE MODD_METRICS_n
USE MODD_DYN_n
USE MODD_DYNZD_n
USE MODD_FIELD_n
USE MODD_MEAN_FIELD_n
USE MODD_MEAN_FIELD
USE MODD_ADV_n
USE MODD_LSFIELD_n
USE MODD_GRID_n
USE MODD_GRID, ONLY: XLONORI,XLATORI
USE MODD_TIME_n
USE MODD_REF_n
USE MODD_FRC_n
USE MODD_CURVCOR_n
USE MODD_DIM_n
USE MODD_BUDGET
USE MODD_RADIATIONS_n
USE MODD_SHADOWS_n
Loading
Loading full blame...