/[lmdze]/trunk/Sources/phylmd/physiq.f
ViewVC logotype

Contents of /trunk/Sources/phylmd/physiq.f

Parent Directory Parent Directory | Revision Log Revision Log


Revision 225 - (show annotations)
Mon Oct 16 12:35:41 2017 UTC (6 years, 6 months ago) by guez
File size: 38995 byte(s)
LMDZE is now in Fortran 2003 (use of allocatable arguments).

gradsdef was not used.

Change names: [uv]10m to [uv]10m_srf in clmain, y[uv]1 to
[uv]1lay. Remove useless complication: zx_alf[12]. Do not modify
[uv]1lay after initial definition from [uv].

Add [uv]10m_srf to output.

Change names in physiq: [uv]10m to [uv]10m_srf, z[uv]10m to [uv]10m,
corresponding to NetCDF output names.

Remove unused complication couchelimite and useless variable inirnpb
in phytrac.

1 module physiq_m
2
3 IMPLICIT none
4
5 contains
6
7 SUBROUTINE physiq(lafin, dayvrai, time, paprs, play, pphi, pphis, u, v, t, &
8 qx, omega, d_u, d_v, d_t, d_qx)
9
10 ! From phylmd/physiq.F, version 1.22 2006/02/20 09:38:28
11 ! (subversion revision 678)
12
13 ! Author: Z. X. Li (LMD/CNRS) 1993
14
15 ! This is the main procedure for the "physics" part of the program.
16
17 use aaam_bud_m, only: aaam_bud
18 USE abort_gcm_m, ONLY: abort_gcm
19 use ajsec_m, only: ajsec
20 use calltherm_m, only: calltherm
21 USE clesphys, ONLY: cdhmax, cdmmax, ecrit_ins, ksta, ksta_ter, ok_kzmin, &
22 ok_instan
23 USE clesphys2, ONLY: conv_emanuel, nbapp_rad, new_oliq, ok_orodr, ok_orolf
24 USE clmain_m, ONLY: clmain
25 use clouds_gno_m, only: clouds_gno
26 use comconst, only: dtphys
27 USE comgeomphy, ONLY: airephy
28 USE concvl_m, ONLY: concvl
29 USE conf_gcm_m, ONLY: lmt_pas
30 USE conf_phys_m, ONLY: conf_phys
31 use conflx_m, only: conflx
32 USE ctherm, ONLY: iflag_thermals, nsplit_thermals
33 use diagcld2_m, only: diagcld2
34 USE dimens_m, ONLY: llm, nqmx
35 USE dimphy, ONLY: klon
36 USE dimsoil, ONLY: nsoilmx
37 use drag_noro_m, only: drag_noro
38 use dynetat0_m, only: day_ref, annee_ref
39 USE fcttre, ONLY: foeew
40 use fisrtilp_m, only: fisrtilp
41 USE hgardfou_m, ONLY: hgardfou
42 USE histsync_m, ONLY: histsync
43 USE histwrite_phy_m, ONLY: histwrite_phy
44 USE indicesol, ONLY: clnsurf, epsfra, is_lic, is_oce, is_sic, is_ter, &
45 nbsrf
46 USE ini_histins_m, ONLY: ini_histins, nid_ins
47 use netcdf95, only: NF95_CLOSE
48 use newmicro_m, only: newmicro
49 use nr_util, only: assert
50 use nuage_m, only: nuage
51 USE orbite_m, ONLY: orbite
52 USE ozonecm_m, ONLY: ozonecm
53 USE phyetat0_m, ONLY: phyetat0, rlat, rlon
54 USE phyredem_m, ONLY: phyredem
55 USE phyredem0_m, ONLY: phyredem0
56 USE phytrac_m, ONLY: phytrac
57 use radlwsw_m, only: radlwsw
58 use yoegwd, only: sugwd
59 USE suphec_m, ONLY: rcpd, retv, rg, rlvtt, romega, rsigma, rtt, rmo3, md
60 use time_phylmdz, only: itap, increment_itap
61 use transp_m, only: transp
62 use transp_lay_m, only: transp_lay
63 use unit_nml_m, only: unit_nml
64 USE ymds2ju_m, ONLY: ymds2ju
65 USE yoethf_m, ONLY: r2es, rvtmp2
66 use zenang_m, only: zenang
67
68 logical, intent(in):: lafin ! dernier passage
69
70 integer, intent(in):: dayvrai
71 ! current day number, based at value 1 on January 1st of annee_ref
72
73 REAL, intent(in):: time ! heure de la journ\'ee en fraction de jour
74
75 REAL, intent(in):: paprs(:, :) ! (klon, llm + 1)
76 ! pression pour chaque inter-couche, en Pa
77
78 REAL, intent(in):: play(:, :) ! (klon, llm)
79 ! pression pour le mileu de chaque couche (en Pa)
80
81 REAL, intent(in):: pphi(:, :) ! (klon, llm)
82 ! géopotentiel de chaque couche (référence sol)
83
84 REAL, intent(in):: pphis(:) ! (klon) géopotentiel du sol
85
86 REAL, intent(in):: u(:, :) ! (klon, llm)
87 ! vitesse dans la direction X (de O a E) en m / s
88
89 REAL, intent(in):: v(:, :) ! (klon, llm) vitesse Y (de S a N) en m / s
90 REAL, intent(in):: t(:, :) ! (klon, llm) temperature (K)
91
92 REAL, intent(in):: qx(:, :, :) ! (klon, llm, nqmx)
93 ! (humidit\'e sp\'ecifique et fractions massiques des autres traceurs)
94
95 REAL, intent(in):: omega(:, :) ! (klon, llm) vitesse verticale en Pa / s
96 REAL, intent(out):: d_u(:, :) ! (klon, llm) tendance physique de "u" (m s-2)
97 REAL, intent(out):: d_v(:, :) ! (klon, llm) tendance physique de "v" (m s-2)
98 REAL, intent(out):: d_t(:, :) ! (klon, llm) tendance physique de "t" (K / s)
99
100 REAL, intent(out):: d_qx(:, :, :) ! (klon, llm, nqmx)
101 ! tendance physique de "qx" (s-1)
102
103 ! Local:
104
105 LOGICAL:: firstcal = .true.
106
107 LOGICAL, PARAMETER:: ok_stratus = .FALSE.
108 ! Ajouter artificiellement les stratus
109
110 ! pour phystoke avec thermiques
111 REAL fm_therm(klon, llm + 1)
112 REAL entr_therm(klon, llm)
113 real, save:: q2(klon, llm + 1, nbsrf)
114
115 INTEGER, PARAMETER:: ivap = 1 ! indice de traceur pour vapeur d'eau
116 INTEGER, PARAMETER:: iliq = 2 ! indice de traceur pour eau liquide
117
118 REAL, save:: t_ancien(klon, llm), q_ancien(klon, llm)
119 LOGICAL, save:: ancien_ok
120
121 REAL d_t_dyn(klon, llm) ! tendance dynamique pour "t" (K / s)
122 REAL d_q_dyn(klon, llm) ! tendance dynamique pour "q" (kg / kg / s)
123
124 real da(klon, llm), phi(klon, llm, llm), mp(klon, llm)
125
126 REAL, save:: swdn0(klon, llm + 1), swdn(klon, llm + 1)
127 REAL, save:: swup0(klon, llm + 1), swup(klon, llm + 1)
128
129 REAL, save:: lwdn0(klon, llm + 1), lwdn(klon, llm + 1)
130 REAL, save:: lwup0(klon, llm + 1), lwup(klon, llm + 1)
131
132 ! prw: precipitable water
133 real prw(klon)
134
135 ! flwp, fiwp = Liquid Water Path & Ice Water Path (kg / m2)
136 ! flwc, fiwc = Liquid Water Content & Ice Water Content (kg / kg)
137 REAL flwp(klon), fiwp(klon)
138 REAL flwc(klon, llm), fiwc(klon, llm)
139
140 ! Variables propres a la physique
141
142 INTEGER, save:: radpas
143 ! Radiative transfer computations are made every "radpas" call to
144 ! "physiq".
145
146 REAL, save:: radsol(klon) ! bilan radiatif au sol calcule par code radiatif
147 REAL, save:: ftsol(klon, nbsrf) ! skin temperature of surface fraction
148
149 REAL, save:: ftsoil(klon, nsoilmx, nbsrf)
150 ! soil temperature of surface fraction
151
152 REAL, save:: fevap(klon, nbsrf) ! evaporation
153 REAL fluxlat(klon, nbsrf)
154
155 REAL, save:: fqsurf(klon, nbsrf)
156 ! humidite de l'air au contact de la surface
157
158 REAL, save:: qsol(klon) ! column-density of water in soil, in kg m-2
159 REAL, save:: fsnow(klon, nbsrf) ! \'epaisseur neigeuse
160 REAL, save:: falbe(klon, nbsrf) ! albedo visible par type de surface
161
162 ! Param\`etres de l'orographie \`a l'\'echelle sous-maille (OESM) :
163 REAL, save:: zmea(klon) ! orographie moyenne
164 REAL, save:: zstd(klon) ! deviation standard de l'OESM
165 REAL, save:: zsig(klon) ! pente de l'OESM
166 REAL, save:: zgam(klon) ! anisotropie de l'OESM
167 REAL, save:: zthe(klon) ! orientation de l'OESM
168 REAL, save:: zpic(klon) ! Maximum de l'OESM
169 REAL, save:: zval(klon) ! Minimum de l'OESM
170 REAL, save:: rugoro(klon) ! longueur de rugosite de l'OESM
171 REAL zulow(klon), zvlow(klon)
172 INTEGER igwd, itest(klon)
173
174 REAL, save:: agesno(klon, nbsrf) ! age de la neige
175 REAL, save:: run_off_lic_0(klon)
176
177 ! Variables li\'ees \`a la convection d'Emanuel :
178 REAL, save:: Ma(klon, llm) ! undilute upward mass flux
179 REAL, save:: qcondc(klon, llm) ! in-cld water content from convect
180 REAL, save:: sig1(klon, llm), w01(klon, llm)
181
182 ! Variables pour la couche limite (Alain Lahellec) :
183 REAL cdragh(klon) ! drag coefficient pour T and Q
184 REAL cdragm(klon) ! drag coefficient pour vent
185
186 ! Pour phytrac :
187 REAL ycoefh(klon, llm) ! coef d'echange pour phytrac
188 REAL yu1(klon), yv1(klon) ! vent dans la premi\`ere couche
189
190 REAL, save:: ffonte(klon, nbsrf)
191 ! flux thermique utilise pour fondre la neige
192
193 REAL, save:: fqcalving(klon, nbsrf)
194 ! flux d'eau "perdue" par la surface et necessaire pour limiter la
195 ! hauteur de neige, en kg / m2 / s
196
197 REAL zxffonte(klon), zxfqcalving(klon)
198
199 REAL, save:: pfrac_impa(klon, llm)! Produits des coefs lessivage impaction
200 REAL, save:: pfrac_nucl(klon, llm)! Produits des coefs lessivage nucleation
201
202 REAL, save:: pfrac_1nucl(klon, llm)
203 ! Produits des coefs lessi nucl (alpha = 1)
204
205 REAL frac_impa(klon, llm) ! fraction d'a\'erosols lessiv\'es (impaction)
206 REAL frac_nucl(klon, llm) ! idem (nucleation)
207
208 REAL, save:: rain_fall(klon)
209 ! liquid water mass flux (kg / m2 / s), positive down
210
211 REAL, save:: snow_fall(klon)
212 ! solid water mass flux (kg / m2 / s), positive down
213
214 REAL rain_tiedtke(klon), snow_tiedtke(klon)
215
216 REAL evap(klon) ! flux d'\'evaporation au sol
217 real devap(klon) ! derivative of the evaporation flux at the surface
218 REAL sens(klon) ! flux de chaleur sensible au sol
219 real dsens(klon) ! derivee du flux de chaleur sensible au sol
220 REAL, save:: dlw(klon) ! derivative of infra-red flux
221 REAL bils(klon) ! bilan de chaleur au sol
222 REAL fder(klon) ! Derive de flux (sensible et latente)
223 REAL ve(klon) ! integr. verticale du transport meri. de l'energie
224 REAL vq(klon) ! integr. verticale du transport meri. de l'eau
225 REAL ue(klon) ! integr. verticale du transport zonal de l'energie
226 REAL uq(klon) ! integr. verticale du transport zonal de l'eau
227
228 REAL, save:: frugs(klon, nbsrf) ! longueur de rugosite
229 REAL zxrugs(klon) ! longueur de rugosite
230
231 ! Conditions aux limites
232
233 INTEGER julien
234 REAL, save:: pctsrf(klon, nbsrf) ! percentage of surface
235 REAL, save:: albsol(klon) ! albedo du sol total, visible, moyen par maille
236 REAL, SAVE:: wo(klon, llm) ! column density of ozone in a cell, in kDU
237 real, parameter:: dobson_u = 2.1415e-05 ! Dobson unit, in kg m-2
238
239 real, save:: clwcon(klon, llm), rnebcon(klon, llm)
240 real, save:: clwcon0(klon, llm), rnebcon0(klon, llm)
241
242 REAL rhcl(klon, llm) ! humiditi relative ciel clair
243 REAL dialiq(klon, llm) ! eau liquide nuageuse
244 REAL diafra(klon, llm) ! fraction nuageuse
245 REAL cldliq(klon, llm) ! eau liquide nuageuse
246 REAL cldfra(klon, llm) ! fraction nuageuse
247 REAL cldtau(klon, llm) ! epaisseur optique
248 REAL cldemi(klon, llm) ! emissivite infrarouge
249
250 REAL flux_q(klon, nbsrf) ! flux turbulent d'humidite à la surface
251 REAL flux_t(klon, nbsrf) ! flux turbulent de chaleur à la surface
252 REAL flux_u(klon, nbsrf) ! flux turbulent de vitesse u à la surface
253 REAL flux_v(klon, nbsrf) ! flux turbulent de vitesse v à la surface
254
255 ! Le rayonnement n'est pas calcul\'e tous les pas, il faut donc que
256 ! les variables soient r\'emanentes.
257 REAL, save:: heat(klon, llm) ! chauffage solaire
258 REAL, save:: heat0(klon, llm) ! chauffage solaire ciel clair
259 REAL, save:: cool(klon, llm) ! refroidissement infrarouge
260 REAL, save:: cool0(klon, llm) ! refroidissement infrarouge ciel clair
261 REAL, save:: topsw(klon), toplw(klon), solsw(klon)
262 REAL, save:: sollw(klon) ! rayonnement infrarouge montant \`a la surface
263 real, save:: sollwdown(klon) ! downward LW flux at surface
264 REAL, save:: topsw0(klon), toplw0(klon), solsw0(klon), sollw0(klon)
265 REAL, save:: albpla(klon)
266 REAL fsollw(klon, nbsrf) ! bilan flux IR pour chaque sous-surface
267 REAL fsolsw(klon, nbsrf) ! flux solaire absorb\'e pour chaque sous-surface
268
269 REAL conv_q(klon, llm) ! convergence de l'humidite (kg / kg / s)
270 REAL conv_t(klon, llm) ! convergence of temperature (K / s)
271
272 REAL cldl(klon), cldm(klon), cldh(klon) ! nuages bas, moyen et haut
273 REAL cldt(klon), cldq(klon) ! nuage total, eau liquide integree
274
275 REAL zxfluxlat(klon)
276 REAL dist, mu0(klon), fract(klon)
277 real longi
278 REAL z_avant(klon), z_apres(klon), z_factor(klon)
279 REAL zb
280 REAL zx_t, zx_qs, zcor
281 real zqsat(klon, llm)
282 INTEGER i, k, iq, nsrf
283 REAL zphi(klon, llm)
284
285 ! cf. Anne Mathieu, variables pour la couche limite atmosphérique (hbtm)
286
287 REAL, SAVE:: pblh(klon, nbsrf) ! Hauteur de couche limite
288 REAL, SAVE:: plcl(klon, nbsrf) ! Niveau de condensation de la CLA
289 REAL, SAVE:: capCL(klon, nbsrf) ! CAPE de couche limite
290 REAL, SAVE:: oliqCL(klon, nbsrf) ! eau_liqu integree de couche limite
291 REAL, SAVE:: cteiCL(klon, nbsrf) ! cloud top instab. crit. couche limite
292 REAL, SAVE:: pblt(klon, nbsrf) ! T \`a la hauteur de couche limite
293 REAL, SAVE:: therm(klon, nbsrf)
294 REAL, SAVE:: trmb1(klon, nbsrf) ! deep_cape
295 REAL, SAVE:: trmb2(klon, nbsrf) ! inhibition
296 REAL, SAVE:: trmb3(klon, nbsrf) ! Point Omega
297 ! Grandeurs de sorties
298 REAL s_pblh(klon), s_lcl(klon), s_capCL(klon)
299 REAL s_oliqCL(klon), s_cteiCL(klon), s_pblt(klon)
300 REAL s_therm(klon), s_trmb1(klon), s_trmb2(klon)
301 REAL s_trmb3(klon)
302
303 ! Variables pour la convection de K. Emanuel :
304
305 REAL upwd(klon, llm) ! saturated updraft mass flux
306 REAL dnwd(klon, llm) ! saturated downdraft mass flux
307 REAL, save:: cape(klon)
308
309 INTEGER iflagctrl(klon) ! flag fonctionnement de convect
310
311 ! Variables du changement
312
313 ! con: convection
314 ! lsc: large scale condensation
315 ! ajs: ajustement sec
316 ! eva: \'evaporation de l'eau liquide nuageuse
317 ! vdf: vertical diffusion in boundary layer
318 REAL d_t_con(klon, llm), d_q_con(klon, llm)
319 REAL, save:: d_u_con(klon, llm), d_v_con(klon, llm)
320 REAL d_t_lsc(klon, llm), d_q_lsc(klon, llm), d_ql_lsc(klon, llm)
321 REAL d_t_ajs(klon, llm), d_q_ajs(klon, llm)
322 REAL d_u_ajs(klon, llm), d_v_ajs(klon, llm)
323 REAL rneb(klon, llm)
324
325 REAL mfu(klon, llm), mfd(klon, llm)
326 REAL pen_u(klon, llm), pen_d(klon, llm)
327 REAL pde_u(klon, llm), pde_d(klon, llm)
328 INTEGER kcbot(klon), kctop(klon), kdtop(klon)
329 REAL pmflxr(klon, llm + 1), pmflxs(klon, llm + 1)
330 REAL prfl(klon, llm + 1), psfl(klon, llm + 1)
331
332 INTEGER, save:: ibas_con(klon), itop_con(klon)
333 real ema_pct(klon) ! Emanuel pressure at cloud top, in Pa
334
335 REAL, save:: rain_con(klon)
336 real rain_lsc(klon)
337 REAL, save:: snow_con(klon) ! neige (mm / s)
338 real snow_lsc(klon)
339 REAL d_ts(klon, nbsrf) ! variation of ftsol
340
341 REAL d_u_vdf(klon, llm), d_v_vdf(klon, llm)
342 REAL d_t_vdf(klon, llm), d_q_vdf(klon, llm)
343
344 REAL d_u_oro(klon, llm), d_v_oro(klon, llm)
345 REAL d_t_oro(klon, llm)
346 REAL d_u_lif(klon, llm), d_v_lif(klon, llm)
347 REAL d_t_lif(klon, llm)
348
349 REAL, save:: ratqs(klon, llm)
350 real ratqss(klon, llm), ratqsc(klon, llm)
351 real:: ratqsbas = 0.01, ratqshaut = 0.3
352
353 ! Parametres lies au nouveau schema de nuages (SB, PDF)
354 real:: fact_cldcon = 0.375
355 real:: facttemps = 1.e-4
356 logical:: ok_newmicro = .true.
357 real facteur
358
359 integer:: iflag_cldcon = 1
360 logical ptconv(klon, llm)
361
362 ! Variables pour effectuer les appels en s\'erie :
363
364 REAL t_seri(klon, llm), q_seri(klon, llm)
365 REAL ql_seri(klon, llm)
366 REAL u_seri(klon, llm), v_seri(klon, llm)
367 REAL tr_seri(klon, llm, nqmx - 2)
368
369 REAL zx_rh(klon, llm)
370
371 REAL zustrdr(klon), zvstrdr(klon)
372 REAL zustrli(klon), zvstrli(klon)
373 REAL zustrph(klon), zvstrph(klon)
374 REAL aam, torsfc
375
376 REAL ve_lay(klon, llm) ! transport meri. de l'energie a chaque niveau vert.
377 REAL vq_lay(klon, llm) ! transport meri. de l'eau a chaque niveau vert.
378 REAL ue_lay(klon, llm) ! transport zonal de l'energie a chaque niveau vert.
379 REAL uq_lay(klon, llm) ! transport zonal de l'eau a chaque niveau vert.
380
381 real date0
382 REAL tsol(klon)
383
384 REAL d_t_ec(klon, llm)
385 ! tendance due \`a la conversion d'\'energie cin\'etique en
386 ! énergie thermique
387
388 REAL, save:: t2m(klon, nbsrf), q2m(klon, nbsrf)
389 ! temperature and humidity at 2 m
390
391 REAL, save:: u10m_srf(klon, nbsrf), v10m_srf(klon, nbsrf)
392 ! composantes du vent \`a 10 m
393
394 REAL zt2m(klon), zq2m(klon) ! température, humidité 2 m moyenne sur 1 maille
395 REAL u10m(klon), v10m(klon) ! vent \`a 10 m moyenn\' sur les sous-surfaces
396
397 ! Aerosol effects:
398
399 REAL, save:: topswad(klon), solswad(klon) ! aerosol direct effect
400 LOGICAL:: ok_ade = .false. ! apply aerosol direct effect
401
402 REAL:: bl95_b0 = 2., bl95_b1 = 0.2
403 ! Parameters in equation (D) of Boucher and Lohmann (1995, Tellus
404 ! B). They link cloud droplet number concentration to aerosol mass
405 ! concentration.
406
407 real zmasse(klon, llm)
408 ! (column-density of mass of air in a cell, in kg m-2)
409
410 integer, save:: ncid_startphy
411
412 namelist /physiq_nml/ fact_cldcon, facttemps, ok_newmicro, iflag_cldcon, &
413 ratqsbas, ratqshaut, ok_ade, bl95_b0, bl95_b1, iflag_thermals, &
414 nsplit_thermals
415
416 !----------------------------------------------------------------
417
418 IF (nqmx < 2) CALL abort_gcm('physiq', &
419 'eaux vapeur et liquide sont indispensables')
420
421 test_firstcal: IF (firstcal) THEN
422 ! initialiser
423 u10m_srf = 0.
424 v10m_srf = 0.
425 t2m = 0.
426 q2m = 0.
427 ffonte = 0.
428 fqcalving = 0.
429 rain_con = 0.
430 snow_con = 0.
431 d_u_con = 0.
432 d_v_con = 0.
433 rnebcon0 = 0.
434 clwcon0 = 0.
435 rnebcon = 0.
436 clwcon = 0.
437 pblh =0. ! Hauteur de couche limite
438 plcl =0. ! Niveau de condensation de la CLA
439 capCL =0. ! CAPE de couche limite
440 oliqCL =0. ! eau_liqu integree de couche limite
441 cteiCL =0. ! cloud top instab. crit. couche limite
442 pblt =0.
443 therm =0.
444 trmb1 =0. ! deep_cape
445 trmb2 =0. ! inhibition
446 trmb3 =0. ! Point Omega
447
448 iflag_thermals = 0
449 nsplit_thermals = 1
450 print *, "Enter namelist 'physiq_nml'."
451 read(unit=*, nml=physiq_nml)
452 write(unit_nml, nml=physiq_nml)
453
454 call conf_phys
455
456 ! Initialiser les compteurs:
457
458 frugs = 0.
459 CALL phyetat0(pctsrf, ftsol, ftsoil, fqsurf, qsol, fsnow, falbe, &
460 fevap, rain_fall, snow_fall, solsw, sollw, dlw, radsol, frugs, &
461 agesno, zmea, zstd, zsig, zgam, zthe, zpic, zval, t_ancien, &
462 q_ancien, ancien_ok, rnebcon, ratqs, clwcon, run_off_lic_0, sig1, &
463 w01, ncid_startphy)
464
465 ! ATTENTION : il faudra a terme relire q2 dans l'etat initial
466 q2 = 1e-8
467
468 radpas = lmt_pas / nbapp_rad
469 print *, "radpas = ", radpas
470
471 ! Initialisation pour le sch\'ema de convection d'Emanuel :
472 IF (conv_emanuel) THEN
473 ibas_con = 1
474 itop_con = 1
475 ENDIF
476
477 IF (ok_orodr) THEN
478 rugoro = MAX(1e-5, zstd * zsig / 2)
479 CALL SUGWD(paprs, play)
480 else
481 rugoro = 0.
482 ENDIF
483
484 ecrit_ins = NINT(ecrit_ins / dtphys)
485
486 ! Initialisation des sorties
487
488 call ini_histins(dtphys, ok_newmicro)
489 CALL ymds2ju(annee_ref, 1, day_ref, 0., date0)
490 ! Positionner date0 pour initialisation de ORCHIDEE
491 print *, 'physiq date0: ', date0
492 CALL phyredem0
493 ENDIF test_firstcal
494
495 ! We will modify variables *_seri and we will not touch variables
496 ! u, v, t, qx:
497 t_seri = t
498 u_seri = u
499 v_seri = v
500 q_seri = qx(:, :, ivap)
501 ql_seri = qx(:, :, iliq)
502 tr_seri = qx(:, :, 3:nqmx)
503
504 tsol = sum(ftsol * pctsrf, dim = 2)
505
506 ! Diagnostic de la tendance dynamique :
507 IF (ancien_ok) THEN
508 DO k = 1, llm
509 DO i = 1, klon
510 d_t_dyn(i, k) = (t_seri(i, k) - t_ancien(i, k)) / dtphys
511 d_q_dyn(i, k) = (q_seri(i, k) - q_ancien(i, k)) / dtphys
512 ENDDO
513 ENDDO
514 ELSE
515 DO k = 1, llm
516 DO i = 1, klon
517 d_t_dyn(i, k) = 0.
518 d_q_dyn(i, k) = 0.
519 ENDDO
520 ENDDO
521 ancien_ok = .TRUE.
522 ENDIF
523
524 ! Ajouter le geopotentiel du sol:
525 DO k = 1, llm
526 DO i = 1, klon
527 zphi(i, k) = pphi(i, k) + pphis(i)
528 ENDDO
529 ENDDO
530
531 ! Check temperatures:
532 CALL hgardfou(t_seri, ftsol)
533
534 call increment_itap
535 julien = MOD(dayvrai, 360)
536 if (julien == 0) julien = 360
537
538 forall (k = 1: llm) zmasse(:, k) = (paprs(:, k) - paprs(:, k + 1)) / rg
539
540 ! \'Evaporation de l'eau liquide nuageuse :
541 DO k = 1, llm
542 DO i = 1, klon
543 zb = MAX(0., ql_seri(i, k))
544 t_seri(i, k) = t_seri(i, k) &
545 - zb * RLVTT / RCPD / (1. + RVTMP2 * q_seri(i, k))
546 q_seri(i, k) = q_seri(i, k) + zb
547 ENDDO
548 ENDDO
549 ql_seri = 0.
550
551 frugs = MAX(frugs, 0.000015)
552 zxrugs = sum(frugs * pctsrf, dim = 2)
553
554 ! Calculs n\'ecessaires au calcul de l'albedo dans l'interface avec
555 ! la surface.
556
557 CALL orbite(REAL(julien), longi, dist)
558 CALL zenang(longi, time, dtphys * radpas, mu0, fract)
559 albsol = sum(falbe * pctsrf, dim = 2)
560
561 ! R\'epartition sous maille des flux longwave et shortwave
562 ! R\'epartition du longwave par sous-surface lin\'earis\'ee
563
564 forall (nsrf = 1: nbsrf)
565 fsollw(:, nsrf) = sollw + 4. * RSIGMA * tsol**3 &
566 * (tsol - ftsol(:, nsrf))
567 fsolsw(:, nsrf) = solsw * (1. - falbe(:, nsrf)) / (1. - albsol)
568 END forall
569
570 CALL clmain(dtphys, pctsrf, t_seri, q_seri, u_seri, v_seri, julien, mu0, &
571 ftsol, cdmmax, cdhmax, ksta, ksta_ter, ok_kzmin, ftsoil, qsol, &
572 paprs, play, fsnow, fqsurf, fevap, falbe, fluxlat, rain_fall, &
573 snow_fall, fsolsw, fsollw, frugs, agesno, rugoro, d_t_vdf, d_q_vdf, &
574 d_u_vdf, d_v_vdf, d_ts, flux_t, flux_q, flux_u, flux_v, cdragh, &
575 cdragm, q2, dsens, devap, ycoefh, yu1, yv1, t2m, q2m, u10m_srf, &
576 v10m_srf, pblh, capCL, oliqCL, cteiCL, pblT, therm, trmb1, trmb2, &
577 trmb3, plcl, fqcalving, ffonte, run_off_lic_0)
578
579 ! Incr\'ementation des flux
580
581 sens = - sum(flux_t * pctsrf, dim = 2)
582 evap = - sum(flux_q * pctsrf, dim = 2)
583 fder = dlw + dsens + devap
584
585 DO k = 1, llm
586 DO i = 1, klon
587 t_seri(i, k) = t_seri(i, k) + d_t_vdf(i, k)
588 q_seri(i, k) = q_seri(i, k) + d_q_vdf(i, k)
589 u_seri(i, k) = u_seri(i, k) + d_u_vdf(i, k)
590 v_seri(i, k) = v_seri(i, k) + d_v_vdf(i, k)
591 ENDDO
592 ENDDO
593
594 ! Update surface temperature:
595
596 call assert(abs(sum(pctsrf, dim = 2) - 1.) <= EPSFRA, 'physiq: pctsrf')
597 ftsol = ftsol + d_ts
598 tsol = sum(ftsol * pctsrf, dim = 2)
599 zxfluxlat = sum(fluxlat * pctsrf, dim = 2)
600 zt2m = sum(t2m * pctsrf, dim = 2)
601 zq2m = sum(q2m * pctsrf, dim = 2)
602 u10m = sum(u10m_srf * pctsrf, dim = 2)
603 v10m = sum(v10m_srf * pctsrf, dim = 2)
604 zxffonte = sum(ffonte * pctsrf, dim = 2)
605 zxfqcalving = sum(fqcalving * pctsrf, dim = 2)
606 s_pblh = sum(pblh * pctsrf, dim = 2)
607 s_lcl = sum(plcl * pctsrf, dim = 2)
608 s_capCL = sum(capCL * pctsrf, dim = 2)
609 s_oliqCL = sum(oliqCL * pctsrf, dim = 2)
610 s_cteiCL = sum(cteiCL * pctsrf, dim = 2)
611 s_pblT = sum(pblT * pctsrf, dim = 2)
612 s_therm = sum(therm * pctsrf, dim = 2)
613 s_trmb1 = sum(trmb1 * pctsrf, dim = 2)
614 s_trmb2 = sum(trmb2 * pctsrf, dim = 2)
615 s_trmb3 = sum(trmb3 * pctsrf, dim = 2)
616
617 ! Si une sous-fraction n'existe pas, elle prend la valeur moyenne :
618 DO nsrf = 1, nbsrf
619 DO i = 1, klon
620 IF (pctsrf(i, nsrf) < epsfra) then
621 ftsol(i, nsrf) = tsol(i)
622 t2m(i, nsrf) = zt2m(i)
623 q2m(i, nsrf) = zq2m(i)
624 u10m_srf(i, nsrf) = u10m(i)
625 v10m_srf(i, nsrf) = v10m(i)
626 ffonte(i, nsrf) = zxffonte(i)
627 fqcalving(i, nsrf) = zxfqcalving(i)
628 pblh(i, nsrf) = s_pblh(i)
629 plcl(i, nsrf) = s_lcl(i)
630 capCL(i, nsrf) = s_capCL(i)
631 oliqCL(i, nsrf) = s_oliqCL(i)
632 cteiCL(i, nsrf) = s_cteiCL(i)
633 pblT(i, nsrf) = s_pblT(i)
634 therm(i, nsrf) = s_therm(i)
635 trmb1(i, nsrf) = s_trmb1(i)
636 trmb2(i, nsrf) = s_trmb2(i)
637 trmb3(i, nsrf) = s_trmb3(i)
638 end IF
639 ENDDO
640 ENDDO
641
642 dlw = - 4. * RSIGMA * tsol**3
643
644 ! Appeler la convection
645
646 if (conv_emanuel) then
647 CALL concvl(paprs, play, t_seri, q_seri, u_seri, v_seri, sig1, w01, &
648 d_t_con, d_q_con, d_u_con, d_v_con, rain_con, ibas_con, itop_con, &
649 upwd, dnwd, Ma, cape, iflagctrl, qcondc, pmflxr, da, phi, mp)
650 snow_con = 0.
651 clwcon0 = qcondc
652 mfu = upwd + dnwd
653
654 zqsat = MIN(0.5, r2es * FOEEW(t_seri, rtt >= t_seri) / play)
655 zqsat = zqsat / (1. - retv * zqsat)
656
657 ! Properties of convective clouds
658 clwcon0 = fact_cldcon * clwcon0
659 call clouds_gno(klon, llm, q_seri, zqsat, clwcon0, ptconv, ratqsc, &
660 rnebcon0)
661
662 forall (i = 1:klon) ema_pct(i) = paprs(i, itop_con(i) + 1)
663 mfd = 0.
664 pen_u = 0.
665 pen_d = 0.
666 pde_d = 0.
667 pde_u = 0.
668 else
669 conv_q = d_q_dyn + d_q_vdf / dtphys
670 conv_t = d_t_dyn + d_t_vdf / dtphys
671 z_avant = sum((q_seri + ql_seri) * zmasse, dim=2)
672 CALL conflx(dtphys, paprs, play, t_seri(:, llm:1:- 1), &
673 q_seri(:, llm:1:- 1), conv_t, conv_q, - evap, omega, &
674 d_t_con, d_q_con, rain_con, snow_con, mfu(:, llm:1:- 1), &
675 mfd(:, llm:1:- 1), pen_u, pde_u, pen_d, pde_d, kcbot, kctop, &
676 kdtop, pmflxr, pmflxs)
677 WHERE (rain_con < 0.) rain_con = 0.
678 WHERE (snow_con < 0.) snow_con = 0.
679 ibas_con = llm + 1 - kcbot
680 itop_con = llm + 1 - kctop
681 END if
682
683 DO k = 1, llm
684 DO i = 1, klon
685 t_seri(i, k) = t_seri(i, k) + d_t_con(i, k)
686 q_seri(i, k) = q_seri(i, k) + d_q_con(i, k)
687 u_seri(i, k) = u_seri(i, k) + d_u_con(i, k)
688 v_seri(i, k) = v_seri(i, k) + d_v_con(i, k)
689 ENDDO
690 ENDDO
691
692 IF (.not. conv_emanuel) THEN
693 z_apres = sum((q_seri + ql_seri) * zmasse, dim=2)
694 z_factor = (z_avant - (rain_con + snow_con) * dtphys) / z_apres
695 DO k = 1, llm
696 DO i = 1, klon
697 IF (z_factor(i) > 1. + 1E-8 .OR. z_factor(i) < 1. - 1E-8) THEN
698 q_seri(i, k) = q_seri(i, k) * z_factor(i)
699 ENDIF
700 ENDDO
701 ENDDO
702 ENDIF
703
704 ! Convection s\`eche (thermiques ou ajustement)
705
706 d_t_ajs = 0.
707 d_u_ajs = 0.
708 d_v_ajs = 0.
709 d_q_ajs = 0.
710 fm_therm = 0.
711 entr_therm = 0.
712
713 if (iflag_thermals == 0) then
714 ! Ajustement sec
715 CALL ajsec(paprs, play, t_seri, q_seri, d_t_ajs, d_q_ajs)
716 t_seri = t_seri + d_t_ajs
717 q_seri = q_seri + d_q_ajs
718 else
719 call calltherm(dtphys, play, paprs, pphi, u_seri, v_seri, t_seri, &
720 q_seri, d_u_ajs, d_v_ajs, d_t_ajs, d_q_ajs, fm_therm, entr_therm)
721 endif
722
723 ! Caclul des ratqs
724
725 ! ratqs convectifs \`a l'ancienne en fonction de (q(z = 0) - q) / q
726 ! on \'ecrase le tableau ratqsc calcul\'e par clouds_gno
727 if (iflag_cldcon == 1) then
728 do k = 1, llm
729 do i = 1, klon
730 if(ptconv(i, k)) then
731 ratqsc(i, k) = ratqsbas + fact_cldcon &
732 * (q_seri(i, 1) - q_seri(i, k)) / q_seri(i, k)
733 else
734 ratqsc(i, k) = 0.
735 endif
736 enddo
737 enddo
738 endif
739
740 ! ratqs stables
741 do k = 1, llm
742 do i = 1, klon
743 ratqss(i, k) = ratqsbas + (ratqshaut - ratqsbas) &
744 * min((paprs(i, 1) - play(i, k)) / (paprs(i, 1) - 3e4), 1.)
745 enddo
746 enddo
747
748 ! ratqs final
749 if (iflag_cldcon == 1 .or. iflag_cldcon == 2) then
750 ! les ratqs sont une conbinaison de ratqss et ratqsc
751 ! ratqs final
752 ! 1e4 (en gros 3 heures), en dur pour le moment, est le temps de
753 ! relaxation des ratqs
754 ratqs = max(ratqs * exp(- dtphys * facttemps), ratqss)
755 ratqs = max(ratqs, ratqsc)
756 else
757 ! on ne prend que le ratqs stable pour fisrtilp
758 ratqs = ratqss
759 endif
760
761 CALL fisrtilp(dtphys, paprs, play, t_seri, q_seri, ptconv, ratqs, &
762 d_t_lsc, d_q_lsc, d_ql_lsc, rneb, cldliq, rain_lsc, snow_lsc, &
763 pfrac_impa, pfrac_nucl, pfrac_1nucl, frac_impa, frac_nucl, prfl, &
764 psfl, rhcl)
765
766 WHERE (rain_lsc < 0) rain_lsc = 0.
767 WHERE (snow_lsc < 0) snow_lsc = 0.
768 DO k = 1, llm
769 DO i = 1, klon
770 t_seri(i, k) = t_seri(i, k) + d_t_lsc(i, k)
771 q_seri(i, k) = q_seri(i, k) + d_q_lsc(i, k)
772 ql_seri(i, k) = ql_seri(i, k) + d_ql_lsc(i, k)
773 cldfra(i, k) = rneb(i, k)
774 IF (.NOT.new_oliq) cldliq(i, k) = ql_seri(i, k)
775 ENDDO
776 ENDDO
777
778 ! PRESCRIPTION DES NUAGES POUR LE RAYONNEMENT
779
780 ! 1. NUAGES CONVECTIFS
781
782 IF (iflag_cldcon <= - 1) THEN
783 ! seulement pour Tiedtke
784 snow_tiedtke = 0.
785 if (iflag_cldcon == - 1) then
786 rain_tiedtke = rain_con
787 else
788 rain_tiedtke = 0.
789 do k = 1, llm
790 do i = 1, klon
791 if (d_q_con(i, k) < 0.) then
792 rain_tiedtke(i) = rain_tiedtke(i) - d_q_con(i, k) / dtphys &
793 * zmasse(i, k)
794 endif
795 enddo
796 enddo
797 endif
798
799 ! Nuages diagnostiques pour Tiedtke
800 CALL diagcld1(paprs, play, rain_tiedtke, snow_tiedtke, ibas_con, &
801 itop_con, diafra, dialiq)
802 DO k = 1, llm
803 DO i = 1, klon
804 IF (diafra(i, k) > cldfra(i, k)) THEN
805 cldliq(i, k) = dialiq(i, k)
806 cldfra(i, k) = diafra(i, k)
807 ENDIF
808 ENDDO
809 ENDDO
810 ELSE IF (iflag_cldcon == 3) THEN
811 ! On prend pour les nuages convectifs le maximum du calcul de
812 ! la convection et du calcul du pas de temps pr\'ec\'edent diminu\'e
813 ! d'un facteur facttemps.
814 facteur = dtphys * facttemps
815 do k = 1, llm
816 do i = 1, klon
817 rnebcon(i, k) = rnebcon(i, k) * facteur
818 if (rnebcon0(i, k) * clwcon0(i, k) &
819 > rnebcon(i, k) * clwcon(i, k)) then
820 rnebcon(i, k) = rnebcon0(i, k)
821 clwcon(i, k) = clwcon0(i, k)
822 endif
823 enddo
824 enddo
825
826 ! On prend la somme des fractions nuageuses et des contenus en eau
827 cldfra = min(max(cldfra, rnebcon), 1.)
828 cldliq = cldliq + rnebcon * clwcon
829 ENDIF
830
831 ! 2. Nuages stratiformes
832
833 IF (ok_stratus) THEN
834 CALL diagcld2(paprs, play, t_seri, q_seri, diafra, dialiq)
835 DO k = 1, llm
836 DO i = 1, klon
837 IF (diafra(i, k) > cldfra(i, k)) THEN
838 cldliq(i, k) = dialiq(i, k)
839 cldfra(i, k) = diafra(i, k)
840 ENDIF
841 ENDDO
842 ENDDO
843 ENDIF
844
845 ! Precipitation totale
846 DO i = 1, klon
847 rain_fall(i) = rain_con(i) + rain_lsc(i)
848 snow_fall(i) = snow_con(i) + snow_lsc(i)
849 ENDDO
850
851 ! Humidit\'e relative pour diagnostic :
852 DO k = 1, llm
853 DO i = 1, klon
854 zx_t = t_seri(i, k)
855 zx_qs = r2es * FOEEW(zx_t, rtt >= zx_t) / play(i, k)
856 zx_qs = MIN(0.5, zx_qs)
857 zcor = 1. / (1. - retv * zx_qs)
858 zx_qs = zx_qs * zcor
859 zx_rh(i, k) = q_seri(i, k) / zx_qs
860 zqsat(i, k) = zx_qs
861 ENDDO
862 ENDDO
863
864 ! Param\`etres optiques des nuages et quelques param\`etres pour
865 ! diagnostics :
866 if (ok_newmicro) then
867 CALL newmicro(paprs, play, t_seri, cldliq, cldfra, cldtau, cldemi, &
868 cldh, cldl, cldm, cldt, cldq, flwp, fiwp, flwc, fiwc)
869 else
870 CALL nuage(paprs, play, t_seri, cldliq, cldfra, cldtau, cldemi, cldh, &
871 cldl, cldm, cldt, cldq)
872 endif
873
874 IF (MOD(itap - 1, radpas) == 0) THEN
875 wo = ozonecm(REAL(julien), paprs)
876 albsol = sum(falbe * pctsrf, dim = 2)
877 CALL radlwsw(dist, mu0, fract, paprs, play, tsol, albsol, t_seri, &
878 q_seri, wo, cldfra, cldemi, cldtau, heat, heat0, cool, cool0, &
879 radsol, albpla, topsw, toplw, solsw, sollw, sollwdown, topsw0, &
880 toplw0, solsw0, sollw0, lwdn0, lwdn, lwup0, lwup, swdn0, swdn, &
881 swup0, swup, ok_ade, topswad, solswad)
882 ENDIF
883
884 ! Ajouter la tendance des rayonnements (tous les pas)
885 DO k = 1, llm
886 DO i = 1, klon
887 t_seri(i, k) = t_seri(i, k) + (heat(i, k) - cool(i, k)) * dtphys &
888 / 86400.
889 ENDDO
890 ENDDO
891
892 ! Calculer le bilan du sol et la d\'erive de temp\'erature (couplage)
893 DO i = 1, klon
894 bils(i) = radsol(i) - sens(i) + zxfluxlat(i)
895 ENDDO
896
897 ! Param\'etrisation de l'orographie \`a l'\'echelle sous-maille :
898
899 IF (ok_orodr) THEN
900 ! S\'election des points pour lesquels le sch\'ema est actif :
901 igwd = 0
902 DO i = 1, klon
903 itest(i) = 0
904 IF (zpic(i) - zmea(i) > 100. .AND. zstd(i) > 10.) THEN
905 itest(i) = 1
906 igwd = igwd + 1
907 ENDIF
908 ENDDO
909
910 CALL drag_noro(klon, llm, dtphys, paprs, play, zmea, zstd, zsig, zgam, &
911 zthe, zpic, zval, itest, t_seri, u_seri, v_seri, zulow, zvlow, &
912 zustrdr, zvstrdr, d_t_oro, d_u_oro, d_v_oro)
913
914 ! ajout des tendances
915 DO k = 1, llm
916 DO i = 1, klon
917 t_seri(i, k) = t_seri(i, k) + d_t_oro(i, k)
918 u_seri(i, k) = u_seri(i, k) + d_u_oro(i, k)
919 v_seri(i, k) = v_seri(i, k) + d_v_oro(i, k)
920 ENDDO
921 ENDDO
922 ENDIF
923
924 IF (ok_orolf) THEN
925 ! S\'election des points pour lesquels le sch\'ema est actif :
926 igwd = 0
927 DO i = 1, klon
928 itest(i) = 0
929 IF (zpic(i) - zmea(i) > 100.) THEN
930 itest(i) = 1
931 igwd = igwd + 1
932 ENDIF
933 ENDDO
934
935 CALL lift_noro(klon, llm, dtphys, paprs, play, rlat, zmea, zstd, zpic, &
936 itest, t_seri, u_seri, v_seri, zulow, zvlow, zustrli, zvstrli, &
937 d_t_lif, d_u_lif, d_v_lif)
938
939 ! Ajout des tendances :
940 DO k = 1, llm
941 DO i = 1, klon
942 t_seri(i, k) = t_seri(i, k) + d_t_lif(i, k)
943 u_seri(i, k) = u_seri(i, k) + d_u_lif(i, k)
944 v_seri(i, k) = v_seri(i, k) + d_v_lif(i, k)
945 ENDDO
946 ENDDO
947 ENDIF
948
949 ! Stress n\'ecessaires : toute la physique
950
951 DO i = 1, klon
952 zustrph(i) = 0.
953 zvstrph(i) = 0.
954 ENDDO
955 DO k = 1, llm
956 DO i = 1, klon
957 zustrph(i) = zustrph(i) + (u_seri(i, k) - u(i, k)) / dtphys &
958 * zmasse(i, k)
959 zvstrph(i) = zvstrph(i) + (v_seri(i, k) - v(i, k)) / dtphys &
960 * zmasse(i, k)
961 ENDDO
962 ENDDO
963
964 CALL aaam_bud(rg, romega, rlat, rlon, pphis, zustrdr, zustrli, zustrph, &
965 zvstrdr, zvstrli, zvstrph, paprs, u, v, aam, torsfc)
966
967 ! Calcul des tendances traceurs
968 call phytrac(julien, time, firstcal, lafin, dtphys, t, paprs, play, mfu, &
969 mfd, pde_u, pen_d, ycoefh, fm_therm, entr_therm, yu1, yv1, ftsol, &
970 pctsrf, frac_impa, frac_nucl, da, phi, mp, upwd, dnwd, tr_seri, &
971 zmasse, ncid_startphy)
972
973 ! Calculer le transport de l'eau et de l'energie (diagnostique)
974 CALL transp(paprs, t_seri, q_seri, u_seri, v_seri, zphi, ve, vq, ue, uq)
975
976 ! diag. bilKP
977
978 CALL transp_lay(paprs, t_seri, q_seri, u_seri, v_seri, zphi, &
979 ve_lay, vq_lay, ue_lay, uq_lay)
980
981 ! Accumuler les variables a stocker dans les fichiers histoire:
982
983 ! conversion Ec en énergie thermique
984 DO k = 1, llm
985 DO i = 1, klon
986 d_t_ec(i, k) = 0.5 / (RCPD * (1. + RVTMP2 * q_seri(i, k))) &
987 * (u(i, k)**2 + v(i, k)**2 - u_seri(i, k)**2 - v_seri(i, k)**2)
988 t_seri(i, k) = t_seri(i, k) + d_t_ec(i, k)
989 d_t_ec(i, k) = d_t_ec(i, k) / dtphys
990 END DO
991 END DO
992
993 ! SORTIES
994
995 ! prw = eau precipitable
996 DO i = 1, klon
997 prw(i) = 0.
998 DO k = 1, llm
999 prw(i) = prw(i) + q_seri(i, k) * zmasse(i, k)
1000 ENDDO
1001 ENDDO
1002
1003 ! Convertir les incrementations en tendances
1004
1005 DO k = 1, llm
1006 DO i = 1, klon
1007 d_u(i, k) = (u_seri(i, k) - u(i, k)) / dtphys
1008 d_v(i, k) = (v_seri(i, k) - v(i, k)) / dtphys
1009 d_t(i, k) = (t_seri(i, k) - t(i, k)) / dtphys
1010 d_qx(i, k, ivap) = (q_seri(i, k) - qx(i, k, ivap)) / dtphys
1011 d_qx(i, k, iliq) = (ql_seri(i, k) - qx(i, k, iliq)) / dtphys
1012 ENDDO
1013 ENDDO
1014
1015 DO iq = 3, nqmx
1016 DO k = 1, llm
1017 DO i = 1, klon
1018 d_qx(i, k, iq) = (tr_seri(i, k, iq - 2) - qx(i, k, iq)) / dtphys
1019 ENDDO
1020 ENDDO
1021 ENDDO
1022
1023 ! Sauvegarder les valeurs de t et q a la fin de la physique:
1024 DO k = 1, llm
1025 DO i = 1, klon
1026 t_ancien(i, k) = t_seri(i, k)
1027 q_ancien(i, k) = q_seri(i, k)
1028 ENDDO
1029 ENDDO
1030
1031 CALL histwrite_phy("phis", pphis)
1032 CALL histwrite_phy("aire", airephy)
1033 CALL histwrite_phy("psol", paprs(:, 1))
1034 CALL histwrite_phy("precip", rain_fall + snow_fall)
1035 CALL histwrite_phy("plul", rain_lsc + snow_lsc)
1036 CALL histwrite_phy("pluc", rain_con + snow_con)
1037 CALL histwrite_phy("tsol", tsol)
1038 CALL histwrite_phy("t2m", zt2m)
1039 CALL histwrite_phy("q2m", zq2m)
1040 CALL histwrite_phy("u10m", u10m)
1041 CALL histwrite_phy("v10m", v10m)
1042 CALL histwrite_phy("snow", snow_fall)
1043 CALL histwrite_phy("cdrm", cdragm)
1044 CALL histwrite_phy("cdrh", cdragh)
1045 CALL histwrite_phy("topl", toplw)
1046 CALL histwrite_phy("evap", evap)
1047 CALL histwrite_phy("sols", solsw)
1048 CALL histwrite_phy("soll", sollw)
1049 CALL histwrite_phy("solldown", sollwdown)
1050 CALL histwrite_phy("bils", bils)
1051 CALL histwrite_phy("sens", - sens)
1052 CALL histwrite_phy("fder", fder)
1053 CALL histwrite_phy("dtsvdfo", d_ts(:, is_oce))
1054 CALL histwrite_phy("dtsvdft", d_ts(:, is_ter))
1055 CALL histwrite_phy("dtsvdfg", d_ts(:, is_lic))
1056 CALL histwrite_phy("dtsvdfi", d_ts(:, is_sic))
1057
1058 DO nsrf = 1, nbsrf
1059 CALL histwrite_phy("pourc_"//clnsurf(nsrf), pctsrf(:, nsrf) * 100.)
1060 CALL histwrite_phy("fract_"//clnsurf(nsrf), pctsrf(:, nsrf))
1061 CALL histwrite_phy("sens_"//clnsurf(nsrf), flux_t(:, nsrf))
1062 CALL histwrite_phy("lat_"//clnsurf(nsrf), fluxlat(:, nsrf))
1063 CALL histwrite_phy("tsol_"//clnsurf(nsrf), ftsol(:, nsrf))
1064 CALL histwrite_phy("taux_"//clnsurf(nsrf), flux_u(:, nsrf))
1065 CALL histwrite_phy("tauy_"//clnsurf(nsrf), flux_v(:, nsrf))
1066 CALL histwrite_phy("rugs_"//clnsurf(nsrf), frugs(:, nsrf))
1067 CALL histwrite_phy("albe_"//clnsurf(nsrf), falbe(:, nsrf))
1068 CALL histwrite_phy("u10m_"//clnsurf(nsrf), u10m_srf(:, nsrf))
1069 CALL histwrite_phy("v10m_"//clnsurf(nsrf), v10m_srf(:, nsrf))
1070 END DO
1071
1072 CALL histwrite_phy("albs", albsol)
1073 CALL histwrite_phy("tro3", wo * dobson_u * 1e3 / zmasse / rmo3 * md)
1074 CALL histwrite_phy("rugs", zxrugs)
1075 CALL histwrite_phy("s_pblh", s_pblh)
1076 CALL histwrite_phy("s_pblt", s_pblt)
1077 CALL histwrite_phy("s_lcl", s_lcl)
1078 CALL histwrite_phy("s_capCL", s_capCL)
1079 CALL histwrite_phy("s_oliqCL", s_oliqCL)
1080 CALL histwrite_phy("s_cteiCL", s_cteiCL)
1081 CALL histwrite_phy("s_therm", s_therm)
1082 CALL histwrite_phy("s_trmb1", s_trmb1)
1083 CALL histwrite_phy("s_trmb2", s_trmb2)
1084 CALL histwrite_phy("s_trmb3", s_trmb3)
1085
1086 if (conv_emanuel) then
1087 CALL histwrite_phy("ptop", ema_pct)
1088 CALL histwrite_phy("dnwd0", - mp)
1089 end if
1090
1091 CALL histwrite_phy("temp", t_seri)
1092 CALL histwrite_phy("vitu", u_seri)
1093 CALL histwrite_phy("vitv", v_seri)
1094 CALL histwrite_phy("geop", zphi)
1095 CALL histwrite_phy("pres", play)
1096 CALL histwrite_phy("dtvdf", d_t_vdf)
1097 CALL histwrite_phy("dqvdf", d_q_vdf)
1098 CALL histwrite_phy("rhum", zx_rh)
1099 CALL histwrite_phy("d_t_ec", d_t_ec)
1100 CALL histwrite_phy("dtsw0", heat0 / 86400.)
1101 CALL histwrite_phy("dtlw0", - cool0 / 86400.)
1102 CALL histwrite_phy("msnow", sum(fsnow * pctsrf, dim = 2))
1103 call histwrite_phy("qsurf", sum(fqsurf * pctsrf, dim = 2))
1104
1105 if (ok_instan) call histsync(nid_ins)
1106
1107 IF (lafin) then
1108 call NF95_CLOSE(ncid_startphy)
1109 CALL phyredem(pctsrf, ftsol, ftsoil, fqsurf, qsol, &
1110 fsnow, falbe, fevap, rain_fall, snow_fall, solsw, sollw, dlw, &
1111 radsol, frugs, agesno, zmea, zstd, zsig, zgam, zthe, zpic, zval, &
1112 t_ancien, q_ancien, rnebcon, ratqs, clwcon, run_off_lic_0, sig1, &
1113 w01)
1114 end IF
1115
1116 firstcal = .FALSE.
1117
1118 END SUBROUTINE physiq
1119
1120 end module physiq_m

  ViewVC Help
Powered by ViewVC 1.1.21