source: LMDZ6/branches/Ocean_skin/libf/phylmd/thermcell_main.F90 @ 4766

Last change on this file since 4766 was 4368, checked in by lguez, 23 months ago

Sync latest trunk changes to Ocean_skin

  • Property copyright set to
    Name of program: LMDZ
    Creation date: 1984
    Version: LMDZ5
    License: CeCILL version 2
    Holder: Laboratoire de m\'et\'eorologie dynamique, CNRS, UMR 8539
    See the license file in the root directory
  • Property svn:eol-style set to native
  • Property svn:keywords set to Author Date Id Revision
File size: 29.5 KB
RevLine 
[4368]1
[1403]2! $Id: thermcell_main.F90 4368 2022-12-05 23:01:16Z lguez $
[878]3!
[4368]4      subroutine thermcell_main(itap,ngrid,nlay,ptimestep  &
[878]5     &                  ,pplay,pplev,pphi,debut  &
6     &                  ,pu,pv,pt,po  &
7     &                  ,pduadj,pdvadj,pdtadj,pdoadj  &
[1026]8     &                  ,fm0,entr0,detr0,zqta,zqla,lmax  &
[878]9     &                  ,ratqscth,ratqsdiff,zqsatth  &
[1403]10     &                  ,zmax0, f0,zw2,fraca,ztv &
[4368]11     &                  ,zpspsk,ztla,zthl,ztva &
12     &                  ,pcon,rhobarz,wth3,wmax_sec,lalim,fm,alim_star,zmax &
13#ifdef ISO         
14     &      ,xtpo,xtpdoadj &
15#endif         
16     &   )
[878]17
[4368]18
19      USE thermcell_ini_mod, ONLY: thermcell_ini,dqimpl,dvdq,prt_level,lunout,prt_level
20      USE thermcell_ini_mod, ONLY: iflag_thermals_closure,iflag_thermals_ed,tau_thermals,r_aspect_thermals
21      USE thermcell_ini_mod, ONLY: RD,RG
22
23#ifdef ISO
24  USE infotrac_phy, ONLY : ntiso
25#ifdef ISOVERIF
26  USE isotopes_mod, ONLY : iso_eau,iso_HDO
27  USE isotopes_verif_mod, ONLY: iso_verif_egalite, &
28        iso_verif_aberrant_encadre
29#endif
30#endif
31
32
[878]33      IMPLICIT NONE
34
35!=======================================================================
36!   Auteurs: Frederic Hourdin, Catherine Rio, Anne Mathieu
37!   Version du 09.02.07
38!   Calcul du transport vertical dans la couche limite en presence
39!   de "thermiques" explicitement representes avec processus nuageux
40!
[1403]41!   Reecriture a partir d'un listing papier a Habas, le 14/02/00
[878]42!
[1403]43!   le thermique est suppose homogene et dissipe par melange avec
44!   son environnement. la longueur l_mix controle l'efficacite du
45!   melange
[878]46!
[1403]47!   Le calcul du transport des differentes especes se fait en prenant
[878]48!   en compte:
49!     1. un flux de masse montant
50!     2. un flux de masse descendant
51!     3. un entrainement
52!     4. un detrainement
53!
[1738]54! Modif 2013/01/04 (FH hourdin@lmd.jussieu.fr)
55!    Introduction of an implicit computation of vertical advection in
56!    the environment of thermal plumes in thermcell_dq
57!    impl =     0 : explicit, 1 : implicit, -1 : old version
58!    controled by iflag_thermals =
59!       15, 16 run with impl=-1 : numerical convergence with NPv3
60!       17, 18 run with impl=1  : more stable
61!    15 and 17 correspond to the activation of the stratocumulus "bidouille"
62!
[4368]63! Using
64!    abort_physic
65!    iso_verif_aberrant_encadre
66!    iso_verif_egalite
67!    test_ltherm
68!    thermcell_closure
69!    thermcell_dq
70!    thermcell_dry
71!    thermcell_dv2
72!    thermcell_env
73!    thermcell_flux2
74!    thermcell_height
75!    thermcell_plume
76!    thermcell_plume_5B
77!    thermcell_plume_6A
78!
[878]79!=======================================================================
80
[1738]81
[878]82!-----------------------------------------------------------------------
83!   declarations:
84!   -------------
85
86
87!   arguments:
88!   ----------
[4368]89      integer, intent(in) :: itap,ngrid,nlay
90      real, intent(in) ::  ptimestep
91      real, intent(in), dimension(ngrid,nlay)    :: pt,pu,pv,po,pplay,pphi,zpspsk
92      real, intent(in), dimension(ngrid,nlay+1)  :: pplev
93      integer, intent(out), dimension(ngrid) :: lmax
94      real, intent(out), dimension(ngrid,nlay)   :: pdtadj,pduadj,pdvadj,pdoadj,entr0,detr0
95      real, intent(out), dimension(ngrid,nlay)   :: ztla,zqla,zqta,zqsatth,zthl
96      real, intent(out), dimension(ngrid,nlay+1) :: fm0,zw2,fraca
97      real, intent(inout), dimension(ngrid) :: zmax0,f0
98      real, intent(out), dimension(ngrid,nlay) :: ztva,ztv
99      logical, intent(in) :: debut
100      real,intent(out), dimension(ngrid,nlay) :: ratqscth,ratqsdiff
[878]101
[4368]102      real, intent(out), dimension(ngrid) :: pcon
103      real, intent(out), dimension(ngrid,nlay) :: rhobarz,wth3
104      real, intent(out), dimension(ngrid) :: wmax_sec
105      integer,intent(out), dimension(ngrid) :: lalim
106      real, intent(out), dimension(ngrid,nlay+1) :: fm
107      real, intent(out), dimension(ngrid,nlay) :: alim_star
108      real, intent(out), dimension(ngrid) :: zmax
[972]109
[878]110!   local:
111!   ------
112
[1738]113
[883]114      integer,save :: igout=1
[987]115!$OMP THREADPRIVATE(igout)
[938]116      integer,save :: lunout1=6
[987]117!$OMP THREADPRIVATE(lunout1)
[883]118      integer,save :: lev_out=10
[987]119!$OMP THREADPRIVATE(lev_out)
[878]120
[4368]121      real lambda, zf,zf2,var,vardiff,CHI
122      integer ig,k,l,ierr,ll
[878]123      logical sorties
[4368]124      real, dimension(ngrid) :: linter,zmix, zmax_sec
125      integer,dimension(ngrid) :: lmin,lmix,lmix_bis,nivcon
126      real, dimension(ngrid,nlay) :: ztva_est
127      real, dimension(ngrid,nlay) :: deltaz,zlay,zh,zdthladj,zu,zv,zo,zl,zva,zua,zoa
128      real, dimension(ngrid,nlay) :: zta,zha,q2,wq,wthl,wthv,thetath2,wth2
129      real, dimension(ngrid,nlay) :: rho,masse
130      real, dimension(ngrid,nlay+1) :: zw_est,zlev
131      real, dimension(ngrid) :: wmax,wmax_tmp
132      real, dimension(ngrid,nlay+1) :: f_star
133      real, dimension(ngrid,nlay) :: entr,detr,entr_star,detr_star,alim_star_clos
134      real, dimension(ngrid,nlay) :: zqsat,csc
135      real, dimension(ngrid) :: zcon,zcon2,alim_star_tot,f
[878]136
[4368]137      character (len=20) :: modname='thermcell_main'
138      character (len=80) :: abort_message
[878]139
140
[4368]141#ifdef ISO
142      REAL xtpo(ntiso,ngrid,nlay),xtpdoadj(ntiso,ngrid,nlay)
143      REAL xtzo(ntiso,ngrid,nlay)
144      REAL xtpdoadj_tmp(ngrid,nlay)
145      REAL xtpo_tmp(ngrid,nlay)
146      REAL xtzo_tmp(ngrid,nlay)
147      integer ixt
148#endif
[878]149
150!
151
152!-----------------------------------------------------------------------
153!   initialisation:
154!   ---------------
155!
[1943]156   fm=0. ; entr=0. ; detr=0.
[972]157
[938]158      if (prt_level.ge.1) print*,'thermcell_main V4'
[878]159
160       sorties=.true.
[4368]161      IF(ngrid.NE.ngrid) THEN
[878]162         PRINT*
163         PRINT*,'STOP dans convadj'
164         PRINT*,'ngrid    =',ngrid
[4368]165         PRINT*,'ngrid  =',ngrid
[878]166      ENDIF
167!
[1403]168!     write(lunout,*)'WARNING thermcell_main f0=max(f0,1.e-2)'
[4368]169     do ig=1,ngrid
[972]170         f0(ig)=max(f0(ig),1.e-2)
[1403]171         zmax0(ig)=max(zmax0(ig),40.)
[972]172!IMmarche pas ?!       if (f0(ig)<1.e-2) f0(ig)=1.e-2
173     enddo
[878]174
[1494]175      if (prt_level.ge.20) then
176       do ig=1,ngrid
177          print*,'th_main ig f0',ig,f0(ig)
178       enddo
179      endif
[878]180!-----------------------------------------------------------------------
181! Calcul de T,q,ql a partir de Tl et qT dans l environnement
182!   --------------------------------------------------------------------
183!
184      CALL thermcell_env(ngrid,nlay,po,pt,pu,pv,pplay,  &
185     &           pplev,zo,zh,zl,ztv,zthl,zu,zv,zpspsk,zqsat,lev_out)
186       
[938]187      if (prt_level.ge.1) print*,'thermcell_main apres thermcell_env'
[878]188
189!------------------------------------------------------------------------
190!                       --------------------
191!
192!
193!                       + + + + + + + + + + +
194!
195!
196!  wa, fraca, wd, fracd --------------------   zlev(2), rhobarz
197!  wh,wt,wo ...
198!
199!                       + + + + + + + + + + +  zh,zu,zv,zo,rho
200!
201!
202!                       --------------------   zlev(1)
203!                       \\\\\\\\\\\\\\\\\\\\
204!
205!
206
207!-----------------------------------------------------------------------
208!   Calcul des altitudes des couches
209!-----------------------------------------------------------------------
210
211      do l=2,nlay
212         zlev(:,l)=0.5*(pphi(:,l)+pphi(:,l-1))/RG
213      enddo
[4368]214      zlev(:,1)=0.
215      zlev(:,nlay+1)=(2.*pphi(:,nlay)-pphi(:,nlay-1))/RG
[878]216      do l=1,nlay
217         zlay(:,l)=pphi(:,l)/RG
218      enddo
219      do l=1,nlay
220         deltaz(:,l)=zlev(:,l+1)-zlev(:,l)
221      enddo
222
223!-----------------------------------------------------------------------
[4368]224!   Calcul des densites et masses
[878]225!-----------------------------------------------------------------------
226
[4368]227      rho(:,:)=pplay(:,:)/(zpspsk(:,:)*RD*ztv(:,:))
228      if (prt_level.ge.10) write(lunout,*) 'WARNING thermcell_main rhobarz(:,1)=rho(:,1)'
[972]229      rhobarz(:,1)=rho(:,1)
[878]230      do l=2,nlay
231         rhobarz(:,l)=0.5*(rho(:,l)+rho(:,l-1))
232      enddo
233      do l=1,nlay
234         masse(:,l)=(pplev(:,l)-pplev(:,l+1))/RG
235      enddo
[938]236      if (prt_level.ge.1) print*,'thermcell_main apres initialisation'
[878]237
238!------------------------------------------------------------------
239!
240!             /|\
241!    --------  |  F_k+1 -------   
242!                              ----> D_k
243!             /|\              <---- E_k , A_k
244!    --------  |  F_k ---------
245!                              ----> D_k-1
246!                              <---- E_k-1 , A_k-1
247!
248!
249!
250!
251!
252!    ---------------------------
253!
254!    ----- F_lmax+1=0 ----------         \
255!            lmax     (zmax)              |
256!    ---------------------------          |
257!                                         |
258!    ---------------------------          |
259!                                         |
260!    ---------------------------          |
261!                                         |
262!    ---------------------------          |
263!                                         |
264!    ---------------------------          |
265!                                         |  E
266!    ---------------------------          |  D
267!                                         |
268!    ---------------------------          |
269!                                         |
270!    ---------------------------  \       |
271!            lalim                 |      |
272!    ---------------------------   |      |
273!                                  |      |
274!    ---------------------------   |      |
275!                                  | A    |
276!    ---------------------------   |      |
277!                                  |      |
278!    ---------------------------   |      |
279!    lmin  (=1 pour le moment)     |      |
280!    ----- F_lmin=0 ------------  /      /
281!
282!    ---------------------------
283!    //////////////////////////
284!
285!
286!=============================================================================
287!  Calculs initiaux ne faisant pas intervenir les changements de phase
288!=============================================================================
289
290!------------------------------------------------------------------
[1403]291!  1. alim_star est le profil vertical de l'alimentation a la base du
292!     panache thermique, calcule a partir de la flotabilite de l'air sec
[878]293!  2. lmin et lalim sont les indices inferieurs et superieurs de alim_star
294!------------------------------------------------------------------
295!
296      entr_star=0. ; detr_star=0. ; alim_star=0. ; alim_star_tot=0.
[1403]297      lmin=1
[878]298
299!-----------------------------------------------------------------------------
300!  3. wmax_sec et zmax_sec sont les vitesses et altitudes maximum d'un
301!     panache sec conservatif (e=d=0) alimente selon alim_star
302!     Il s'agit d'un calcul de type CAPE
[1403]303!     zmax_sec est utilise pour determiner la geometrie du thermique.
[878]304!------------------------------------------------------------------------------
[1403]305!---------------------------------------------------------------------------------
306!calcul du melange et des variables dans le thermique
307!--------------------------------------------------------------------------------
[878]308!
[1403]309      if (prt_level.ge.1) print*,'avant thermcell_plume ',lev_out
[878]310
[3605]311!=====================================================================
312! Old version of thermcell_plume in thermcell_plume_6A.F90
313! It includes both thermcell_plume_6A and thermcell_plume_5B corresponding
314! to the 5B and 6A versions used for CMIP5 and CMIP6.
315! The latest was previously named thermcellV1_plume.
316! The new thermcell_plume is a clean version (removing obsolete
317! options) of thermcell_plume_6A.
318! The 3 versions are controled by
319! flag_thermals_ed <= 9 thermcell_plume_6A
320!                  <= 19 thermcell_plume_5B
321!                  else thermcell_plume (default 20 for convergence with 6A)
322! Fredho
323!=====================================================================
[878]324
[1403]325      if (iflag_thermals_ed<=9) then
326!         print*,'THERM NOUVELLE/NOUVELLE Arnaud'
[3605]327         CALL thermcell_plume_6A(itap,ngrid,nlay,ptimestep,ztv,zthl,po,zl,rhobarz,&
[1403]328     &    zlev,pplev,pphi,zpspsk,alim_star,alim_star_tot,  &
329     &    lalim,f0,detr_star,entr_star,f_star,csc,ztva,  &
330     &    ztla,zqla,zqta,zha,zw2,zw_est,ztva_est,zqsatth,lmix,lmix_bis,linter &
331     &    ,lev_out,lunout1,igout)
[878]332
[3605]333      elseif (iflag_thermals_ed<=19) then
[1403]334!        print*,'THERM RIO et al 2010, version d Arnaud'
[3605]335         CALL thermcell_plume_5B(itap,ngrid,nlay,ptimestep,ztv,zthl,po,zl,rhobarz,&
[1403]336     &    zlev,pplev,pphi,zpspsk,alim_star,alim_star_tot,  &
337     &    lalim,f0,detr_star,entr_star,f_star,csc,ztva,  &
338     &    ztla,zqla,zqta,zha,zw2,zw_est,ztva_est,zqsatth,lmix,lmix_bis,linter &
339     &    ,lev_out,lunout1,igout)
[3605]340      else
341         CALL thermcell_plume(itap,ngrid,nlay,ptimestep,ztv,zthl,po,zl,rhobarz,&
342     &    zlev,pplev,pphi,zpspsk,alim_star,alim_star_tot,  &
343     &    lalim,f0,detr_star,entr_star,f_star,csc,ztva,  &
344     &    ztla,zqla,zqta,zha,zw2,zw_est,ztva_est,zqsatth,lmix,lmix_bis,linter &
345     &    ,lev_out,lunout1,igout)
[1403]346      endif
[878]347
[972]348      if (prt_level.ge.1) print*,'apres thermcell_plume ',lev_out
349
[4368]350      call test_ltherm(ngrid,nlay,pplay,lalim,ztv,po,ztva,zqla,f_star,zw2,'thermcell_plum lalim ')
351      call test_ltherm(ngrid,nlay,pplay,lmix ,ztv,po,ztva,zqla,f_star,zw2,'thermcell_plum lmix  ')
[878]352
[938]353      if (prt_level.ge.1) print*,'thermcell_main apres thermcell_plume'
354      if (prt_level.ge.10) then
[972]355         write(lunout1,*) 'Dans thermcell_main 2'
356         write(lunout1,*) 'lmin ',lmin(igout)
357         write(lunout1,*) 'lalim ',lalim(igout)
358         write(lunout1,*) ' ig l alim_star entr_star detr_star f_star '
359         write(lunout1,'(i6,i4,4e15.5)') (igout,l,alim_star(igout,l),entr_star(igout,l),detr_star(igout,l) &
[878]360     &    ,f_star(igout,l+1),l=1,nint(linter(igout))+5)
361      endif
362
363!-------------------------------------------------------------------------------
364! Calcul des caracteristiques du thermique:zmax,zmix,wmax
365!-------------------------------------------------------------------------------
366!
367      CALL thermcell_height(ngrid,nlay,lalim,lmin,linter,lmix,zw2,  &
[4368]368     &           zlev,lmax,zmax,zmax0,zmix,wmax)
[1403]369! Attention, w2 est transforme en sa racine carree dans cette routine
[4368]370! Le probleme vient du fait que linter et lmix sont souvent egaux a 1.
[1403]371      wmax_tmp=0.
372      do  l=1,nlay
373         wmax_tmp(:)=max(wmax_tmp(:),zw2(:,l))
374      enddo
375!     print*,"ZMAX ",lalim,lmin,linter,lmix,lmax,zmax,zmax0,zmix,wmax
[878]376
377
[1403]378
[4368]379      call test_ltherm(ngrid,nlay,pplay,lalim,ztv,po,ztva,zqla,f_star,zw2,'thermcell_heig lalim ')
380      call test_ltherm(ngrid,nlay,pplay,lmin ,ztv,po,ztva,zqla,f_star,zw2,'thermcell_heig lmin  ')
381      call test_ltherm(ngrid,nlay,pplay,lmix ,ztv,po,ztva,zqla,f_star,zw2,'thermcell_heig lmix  ')
382      call test_ltherm(ngrid,nlay,pplay,lmax ,ztv,po,ztva,zqla,f_star,zw2,'thermcell_heig lmax  ')
[878]383
[938]384      if (prt_level.ge.1) print*,'thermcell_main apres thermcell_height'
[878]385
386!-------------------------------------------------------------------------------
387! Fermeture,determination de f
388!-------------------------------------------------------------------------------
[1026]389!
[1403]390!
391      CALL thermcell_dry(ngrid,nlay,zlev,pphi,ztv,alim_star,  &
[4368]392    &                      lalim,lmin,zmax_sec,wmax_sec)
[878]393
[1998]394 
[4368]395call test_ltherm(ngrid,nlay,pplay,lmin,ztv,po,ztva,zqla,f_star,zw2,'thermcell_dry  lmin  ')
396call test_ltherm(ngrid,nlay,pplay,lalim,ztv,po,ztva,zqla,f_star,zw2,'thermcell_dry  lalim ')
[1403]397
398      if (prt_level.ge.1) print*,'thermcell_main apres thermcell_dry'
399      if (prt_level.ge.10) then
400         write(lunout1,*) 'Dans thermcell_main 1b'
401         write(lunout1,*) 'lmin ',lmin(igout)
402         write(lunout1,*) 'lalim ',lalim(igout)
403         write(lunout1,*) ' ig l alim_star entr_star detr_star f_star '
404         write(lunout1,'(i6,i4,e15.5)') (igout,l,alim_star(igout,l) &
405     &    ,l=1,lalim(igout)+4)
406      endif
407
408
409
410
411! Choix de la fonction d'alimentation utilisee pour la fermeture.
412! Apparemment sans importance
413      alim_star_clos(:,:)=alim_star(:,:)
414      alim_star_clos(:,:)=entr_star(:,:)+alim_star(:,:)
[1998]415!
416!CR Appel de la fermeture seche
417      if (iflag_thermals_closure.eq.1) then
[1403]418
[4368]419     CALL thermcell_closure(ngrid,nlay,r_aspect_thermals,ptimestep,rho,  &
420    &   zlev,lalim,alim_star_clos,zmax_sec,wmax_sec,f)
[878]421
[1403]422!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
423! Appel avec les zmax et wmax tenant compte de la condensation
424! Semble moins bien marcher
[1998]425     else if (iflag_thermals_closure.eq.2) then
426
427     CALL thermcell_closure(ngrid,nlay,r_aspect_thermals,ptimestep,rho,  &
[4368]428    &   zlev,lalim,alim_star,zmax,wmax,f)
[1998]429
[4368]430
[1998]431     endif
432
[1403]433!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
434
[938]435      if(prt_level.ge.1)print*,'thermcell_closure apres thermcell_closure'
[878]436
[972]437      if (tau_thermals>1.) then
438         lambda=exp(-ptimestep/tau_thermals)
439         f0=(1.-lambda)*f+lambda*f0
440      else
441         f0=f
442      endif
443
444! Test valable seulement en 1D mais pas genant
445      if (.not. (f0(1).ge.0.) ) then
[1403]446              abort_message = '.not. (f0(1).ge.0.)'
[2311]447              CALL abort_physic (modname,abort_message,1)
[972]448      endif
449
[878]450!-------------------------------------------------------------------------------
451!deduction des flux
452
[972]453      CALL thermcell_flux2(ngrid,nlay,ptimestep,masse, &
[878]454     &       lalim,lmax,alim_star,  &
455     &       entr_star,detr_star,f,rhobarz,zlev,zw2,fm,entr,  &
[972]456     &       detr,zqla,lev_out,lunout1,igout)
[4368]457
458#undef DevThermcellDown
459#ifdef DevThermcellDown
460      print*,'WARNING !!! routine thermcell_down en cours de developpement'
461      CALL thermcell_down(ngrid,nlay,po,pt,pu,pv,pplay,pplev,  &
462     &           lmax,fm,entr,detr,zthl)
463
464#endif
465
[972]466!IM 060508    &       detr,zqla,zmax,lev_out,lunout,igout)
[878]467
[938]468      if (prt_level.ge.1) print*,'thermcell_main apres thermcell_flux'
[4368]469      call test_ltherm(ngrid,nlay,pplay,lalim,ztv,po,ztva,zqla,f_star,zw2,'thermcell_flux lalim ')
470      call test_ltherm(ngrid,nlay,pplay,lmax ,ztv,po,ztva,zqla,f_star,zw2,'thermcell_flux lmax  ')
[878]471
472!------------------------------------------------------------------
[972]473!   On ne prend pas directement les profils issus des calculs precedents
474!   mais on s'autorise genereusement une relaxation vers ceci avec
475!   une constante de temps tau_thermals (typiquement 1800s).
476!------------------------------------------------------------------
[878]477
[972]478      if (tau_thermals>1.) then
479         lambda=exp(-ptimestep/tau_thermals)
480         fm0=(1.-lambda)*fm+lambda*fm0
481         entr0=(1.-lambda)*entr+lambda*entr0
[1403]482         detr0=(1.-lambda)*detr+lambda*detr0
[878]483      else
484         fm0=fm
485         entr0=entr
486         detr0=detr
487      endif
488
[972]489!c------------------------------------------------------------------
490!   calcul du transport vertical
491!------------------------------------------------------------------
492
[1738]493      call thermcell_dq(ngrid,nlay,dqimpl,ptimestep,fm0,entr0,masse,  &
[878]494     &                    zthl,zdthladj,zta,lev_out)
[1738]495      call thermcell_dq(ngrid,nlay,dqimpl,ptimestep,fm0,entr0,masse,  &
[878]496     &                   po,pdoadj,zoa,lev_out)
497
[4368]498#ifdef ISO
499        ! C Risi: on utilise directement la meme routine
500        do ixt=1,ntiso
501          do ll=1,nlay
502            DO ig=1,ngrid
503                xtpo_tmp(ig,ll)=xtpo(ixt,ig,ll)
504                xtzo_tmp(ig,ll)=xtzo(ixt,ig,ll)
505            enddo
506          enddo
507          call thermcell_dq(ngrid,nlay,dqimpl,ptimestep,fm0,entr0,masse,  &
508     &                   xtpo_tmp,xtpdoadj_tmp,xtzo_tmp,lev_out)
509          do ll=1,nlay
510            DO ig=1,ngrid
511                xtpdoadj(ixt,ig,ll)=xtpdoadj_tmp(ig,ll)
512            enddo
513          enddo
514        enddo
515#endif
516
517#ifdef ISO     
518#ifdef ISOVERIF
519      DO  ll=1,nlay
520        DO ig=1,ngrid
521          if (iso_eau.gt.0) then
522              call iso_verif_egalite(xtpo(iso_eau,ig,ll), &
523     &          po(ig,ll),'thermcell_main 594')
524              call iso_verif_egalite(xtpdoadj(iso_eau,ig,ll), &
525     &          pdoadj(ig,ll),'thermcell_main 596')
526          endif
527          if (iso_HDO.gt.0) then
528              call iso_verif_aberrant_encadre(xtpo(iso_hdo,ig,ll) &
529     &           /po(ig,ll),'thermcell_main 610')
530          endif
531        enddo
532      enddo !DO  ll=1,nlay
533      write(*,*) 'thermcell_main 600 tmp: apres thermcell_dq'
534#endif     
535#endif
536
537
538
[883]539!------------------------------------------------------------------
540! Calcul de la fraction de l'ascendance
541!------------------------------------------------------------------
[4368]542      do ig=1,ngrid
[883]543         fraca(ig,1)=0.
544         fraca(ig,nlay+1)=0.
545      enddo
546      do l=2,nlay
[4368]547         do ig=1,ngrid
[883]548            if (zw2(ig,l).gt.1.e-10) then
549            fraca(ig,l)=fm(ig,l)/(rhobarz(ig,l)*zw2(ig,l))
550            else
551            fraca(ig,l)=0.
552            endif
553         enddo
554      enddo
555     
556!------------------------------------------------------------------
557!  calcul du transport vertical du moment horizontal
558!------------------------------------------------------------------
[878]559
[972]560!IM 090508 
[1738]561      if (dvdq == 0 ) then
[883]562
[878]563! Calcul du transport de V tenant compte d'echange par gradient
564! de pression horizontal avec l'environnement
565
566         call thermcell_dv2(ngrid,nlay,ptimestep,fm0,entr0,masse  &
[1738]567!    &    ,fraca*dvdq,zmax &
568     &    ,fraca,zmax &
[972]569     &    ,zu,zv,pduadj,pdvadj,zua,zva,lev_out)
[1403]570
[878]571      else
572
573! calcul purement conservatif pour le transport de V
[1738]574         call thermcell_dq(ngrid,nlay,dqimpl,ptimestep,fm0,entr0,masse  &
[878]575     &    ,zu,pduadj,zua,lev_out)
[1738]576         call thermcell_dq(ngrid,nlay,dqimpl,ptimestep,fm0,entr0,masse  &
[878]577     &    ,zv,pdvadj,zva,lev_out)
[1738]578
[878]579      endif
580
581!     print*,'13 OK convect8'
582      do l=1,nlay
583         do ig=1,ngrid
584           pdtadj(ig,l)=zdthladj(ig,l)*zpspsk(ig,l) 
585         enddo
586      enddo
587
[972]588      if (prt_level.ge.1) print*,'14 OK convect8'
[878]589!------------------------------------------------------------------
590!   Calculs de diagnostiques pour les sorties
591!------------------------------------------------------------------
592!calcul de fraca pour les sorties
593     
594      if (sorties) then
[972]595      if (prt_level.ge.1) print*,'14a OK convect8'
[878]596! calcul du niveau de condensation
597! initialisation
598      do ig=1,ngrid
[879]599         nivcon(ig)=0
[878]600         zcon(ig)=0.
601      enddo
602!nouveau calcul
603      do ig=1,ngrid
604      CHI=zh(ig,1)/(1669.0-122.0*zo(ig,1)/zqsat(ig,1)-zh(ig,1))
605      pcon(ig)=pplay(ig,1)*(zo(ig,1)/zqsat(ig,1))**CHI
606      enddo
[1403]607!IM   do k=1,nlay
608      do k=1,nlay-1
[878]609         do ig=1,ngrid
610         if ((pcon(ig).le.pplay(ig,k))  &
611     &      .and.(pcon(ig).gt.pplay(ig,k+1))) then
612            zcon2(ig)=zlay(ig,k)-(pcon(ig)-pplay(ig,k))/(RG*rho(ig,k))/100.
613         endif
614         enddo
615      enddo
[1403]616!IM
[1494]617      ierr=0
[1403]618      do ig=1,ngrid
619        if (pcon(ig).le.pplay(ig,nlay)) then
620           zcon2(ig)=zlay(ig,nlay)-(pcon(ig)-pplay(ig,nlay))/(RG*rho(ig,nlay))/100.
[1494]621           ierr=1
622        endif
623      enddo
624      if (ierr==1) then
[1403]625           abort_message = 'thermcellV0_main: les thermiques vont trop haut '
[2311]626           CALL abort_physic (modname,abort_message,1)
[1494]627      endif
628
[972]629      if (prt_level.ge.1) print*,'14b OK convect8'
[878]630      do k=nlay,1,-1
631         do ig=1,ngrid
632            if (zqla(ig,k).gt.1e-10) then
633               nivcon(ig)=k
634               zcon(ig)=zlev(ig,k)
635            endif
636         enddo
637      enddo
[972]638      if (prt_level.ge.1) print*,'14c OK convect8'
[878]639!calcul des moments
640!initialisation
641      do l=1,nlay
642         do ig=1,ngrid
643            q2(ig,l)=0.
644            wth2(ig,l)=0.
645            wth3(ig,l)=0.
646            ratqscth(ig,l)=0.
647            ratqsdiff(ig,l)=0.
648         enddo
649      enddo     
[972]650      if (prt_level.ge.1) print*,'14d OK convect8'
[1146]651      if (prt_level.ge.10)write(lunout,*)                                &
652    &     'WARNING thermcell_main wth2=0. si zw2 > 1.e-10'
[878]653      do l=1,nlay
654         do ig=1,ngrid
655            zf=fraca(ig,l)
656            zf2=zf/(1.-zf)
[972]657!
[1403]658            thetath2(ig,l)=zf2*(ztla(ig,l)-zthl(ig,l))**2
[972]659            if(zw2(ig,l).gt.1.e-10) then
660             wth2(ig,l)=zf2*(zw2(ig,l))**2
661            else
662             wth2(ig,l)=0.
663            endif
[878]664            wth3(ig,l)=zf2*(1-2.*fraca(ig,l))/(1-fraca(ig,l))  &
665     &                *zw2(ig,l)*zw2(ig,l)*zw2(ig,l)
666            q2(ig,l)=zf2*(zqta(ig,l)*1000.-po(ig,l)*1000.)**2
667!test: on calcul q2/po=ratqsc
668            ratqscth(ig,l)=sqrt(max(q2(ig,l),1.e-6)/(po(ig,l)*1000.))
669         enddo
670      enddo
[1403]671!calcul des flux: q, thetal et thetav
672      do l=1,nlay
673         do ig=1,ngrid
674      wq(ig,l)=fraca(ig,l)*zw2(ig,l)*(zqta(ig,l)*1000.-po(ig,l)*1000.)
675      wthl(ig,l)=fraca(ig,l)*zw2(ig,l)*(ztla(ig,l)-zthl(ig,l))
676      wthv(ig,l)=fraca(ig,l)*zw2(ig,l)*(ztva(ig,l)-ztv(ig,l))
677         enddo
[879]678      enddo
[1638]679
[878]680!calcul du ratqscdiff
[972]681      if (prt_level.ge.1) print*,'14e OK convect8'
[878]682      var=0.
683      vardiff=0.
684      ratqsdiff(:,:)=0.
[1494]685
[4368]686      do l=1,nlay
[1494]687         do ig=1,ngrid
688            if (l<=lalim(ig)) then
[878]689            var=var+alim_star(ig,l)*zqta(ig,l)*1000.
[1494]690            endif
[878]691         enddo
692      enddo
[1494]693
[972]694      if (prt_level.ge.1) print*,'14f OK convect8'
[1494]695
[4368]696      do l=1,nlay
[1494]697         do ig=1,ngrid
698            if (l<=lalim(ig)) then
699               zf=fraca(ig,l)
700               zf2=zf/(1.-zf)
701               vardiff=vardiff+alim_star(ig,l)*(zqta(ig,l)*1000.-var)**2
702            endif
703         enddo
[878]704      enddo
[1494]705
[972]706      if (prt_level.ge.1) print*,'14g OK convect8'
[4368]707         do l=1,nlay
708            do ig=1,ngrid
709               ratqsdiff(ig,l)=sqrt(vardiff)/(po(ig,l)*1000.)   
710            enddo
711         enddo
[878]712      endif
713
[938]714      if (prt_level.ge.1) print*,'thermcell_main FIN  OK'
[878]715
[4368]716 RETURN
717      end subroutine thermcell_main
[878]718
[4368]719!=============================================================================
720!/////////////////////////////////////////////////////////////////////////////
721!=============================================================================
722      subroutine test_ltherm(ngrid,nlay,pplay,long,ztv,po,ztva, &  ! in
723    &            zqla,f_star,zw2,comment)                          ! in
724!=============================================================================
725      USE thermcell_ini_mod, ONLY: prt_level
[938]726      IMPLICIT NONE
[878]727
[4368]728      integer i, k, ngrid,nlay
729      real, intent(in), dimension(ngrid,nlay) :: pplay,ztv,po,ztva,zqla
730      real, intent(in), dimension(ngrid,nlay) :: f_star,zw2
731      integer, intent(in), dimension(ngrid) :: long
[878]732      real seuil
733      character*21 comment
734
[4368]735      seuil=0.25
736
[938]737      if (prt_level.ge.1) THEN
738       print*,'WARNING !!! TEST ',comment
739      endif
[879]740      return
741
[878]742!  test sur la hauteur des thermiques ...
[4368]743         do i=1,ngrid
[972]744!IMtemp           if (pplay(i,long(i)).lt.seuil*pplev(i,1)) then
745           if (prt_level.ge.10) then
[878]746               print*,'WARNING ',comment,' au point ',i,' K= ',long(i)
747               print*,'  K  P(MB)  THV(K)     Qenv(g/kg)THVA        QLA(g/kg)   F*        W2'
[4368]748               do k=1,nlay
[878]749                  write(6,'(i3,7f10.3)') k,pplay(i,k),ztv(i,k),1000*po(i,k),ztva(i,k),1000*zqla(i,k),f_star(i,k),zw2(i,k)
750               enddo
[972]751           endif
[878]752         enddo
753
754
755      return
756      end
757
[4368]758! nrlmd le 10/04/2012   Transport de la TKE par le thermique moyen pour la fermeture en ALP
759!                       On transporte pbl_tke pour donner therm_tke
760!                       Copie conforme de la subroutine DTKE dans physiq.F ecrite par Frederic Hourdin
761
762!=======================================================================
763!///////////////////////////////////////////////////////////////////////
764!=======================================================================
765
766      subroutine thermcell_tke_transport( &
767     &     ngrid,nlay,ptimestep,fm0,entr0,rg,pplev,  &   ! in
768     &     therm_tke_max)                                ! out
769      USE thermcell_ini_mod, ONLY: prt_level
[1638]770      implicit none
771
772!=======================================================================
773!
774!   Calcul du transport verticale dans la couche limite en presence
775!   de "thermiques" explicitement representes
776!   calcul du dq/dt une fois qu'on connait les ascendances
777!
778!=======================================================================
779
[4368]780      integer ngrid,nlay
[1638]781
[4368]782      real, intent(in) :: ptimestep
783      real, intent(in), dimension(ngrid,nlay+1) :: fm0,pplev
784      real, intent(in), dimension(ngrid,nlay) :: entr0
785      real, intent(in) :: rg
786      real, intent(out), dimension(ngrid,nlay) :: therm_tke_max
787
[1638]788      real detr0(ngrid,nlay)
[4368]789      real masse0(ngrid,nlay)
[1638]790      real masse(ngrid,nlay),fm(ngrid,nlay+1)
791      real entr(ngrid,nlay)
792      real q(ngrid,nlay)
793      integer lev_out                           ! niveau pour les print
794
795      real qa(ngrid,nlay),detr(ngrid,nlay),wqd(ngrid,nlay+1)
796      integer ig,k
797
798
799      lev_out=0
800
801
802      if (prt_level.ge.1) print*,'Q2 THERMCEL_DQ 0'
803
804!   calcul du detrainement
805      do k=1,nlay
806         detr0(:,k)=fm0(:,k)-fm0(:,k+1)+entr0(:,k)
807         masse0(:,k)=(pplev(:,k)-pplev(:,k+1))/RG
808      enddo
809
810
811! Decalage vertical des entrainements et detrainements.
812      masse(:,1)=0.5*masse0(:,1)
813      entr(:,1)=0.5*entr0(:,1)
814      detr(:,1)=0.5*detr0(:,1)
815      fm(:,1)=0.
816      do k=1,nlay-1
817         masse(:,k+1)=0.5*(masse0(:,k)+masse0(:,k+1))
818         entr(:,k+1)=0.5*(entr0(:,k)+entr0(:,k+1))
819         detr(:,k+1)=0.5*(detr0(:,k)+detr0(:,k+1))
820         fm(:,k+1)=fm(:,k)+entr(:,k)-detr(:,k)
821      enddo
822      fm(:,nlay+1)=0.
823
824
825   q(:,:)=therm_tke_max(:,:)
826!!! nrlmd le 16/09/2010
827      do ig=1,ngrid
828         qa(ig,1)=q(ig,1)
829      enddo
830!!!
831
832    if (1==1) then
833      do k=2,nlay
834         do ig=1,ngrid
835            if ((fm(ig,k+1)+detr(ig,k))*ptimestep.gt.  &
836     &         1.e-5*masse(ig,k)) then
837         qa(ig,k)=(fm(ig,k)*qa(ig,k-1)+entr(ig,k)*q(ig,k))  &
838     &         /(fm(ig,k+1)+detr(ig,k))
839            else
840               qa(ig,k)=q(ig,k)
841            endif
842            if (qa(ig,k).lt.0.) then
843!               print*,'qa<0!!!'
844            endif
845            if (q(ig,k).lt.0.) then
846!               print*,'q<0!!!'
847            endif
848         enddo
849      enddo
850
851! Calcul du flux subsident
852
853      do k=2,nlay
854         do ig=1,ngrid
855            wqd(ig,k)=fm(ig,k)*q(ig,k)
856            if (wqd(ig,k).lt.0.) then
857!               print*,'wqd<0!!!'
858            endif
859         enddo
860      enddo
861      do ig=1,ngrid
862         wqd(ig,1)=0.
863         wqd(ig,nlay+1)=0.
864      enddo
865
866! Calcul des tendances
867      do k=1,nlay
868         do ig=1,ngrid
869            q(ig,k)=q(ig,k)+(detr(ig,k)*qa(ig,k)-entr(ig,k)*q(ig,k)  &
870     &               -wqd(ig,k)+wqd(ig,k+1))  &
871     &               *ptimestep/masse(ig,k)
872         enddo
873      enddo
874
875 endif
876
877   therm_tke_max(:,:)=q(:,:)
878
879      return
880!!! fin nrlmd le 10/04/2012
881     end
882
Note: See TracBrowser for help on using the repository browser.