source: trunk/LMDZ.MARS/libf/phymars/vlz_fi.F @ 2156

Last change on this file since 2156 was 2120, checked in by emillour, 6 years ago

Mars GCM:
Fix a line slightly too long for fixed form Fortran.
EM

File size: 5.8 KB
Line 
1      SUBROUTINE vlz_fi(ngrid,nlay,q,pente_max,masse,w,wq)
2c
3c     Auteurs:   P.Le Van, F.Hourdin, F.Forget
4c
5c    ********************************************************************
6c     Shema  d'advection " pseudo amont " dans la verticale
7c    pour appel dans la physique (sedimentation)
8c    ********************************************************************
9c    q rapport de melange (kg/kg)...
10c    masse : masse de la couche Dp/g
11c    w : masse d'atm ``transferee'' a chaque pas de temps (kg.m-2)
12c    pente_max = 2 conseillee
13c
14c
15c   --------------------------------------------------------------------
16      IMPLICIT NONE
17c
18
19c
20c
21c   Arguments:
22c   ----------
23      integer,intent(in) :: ngrid ! number of atmospheric columns
24      integer,intent(in) :: nlay ! number of atmospheric layers
25      real masse(ngrid,nlay),pente_max
26      REAL q(ngrid,nlay)
27      REAL w(ngrid,nlay)
28      REAL wq(ngrid,nlay+1)
29c
30c      Local
31c   ---------
32c
33      INTEGER i,ij,l,j,ii
34c
35
36      real dzq(ngrid,nlay),dzqw(ngrid,nlay),adzqw(ngrid,nlay),dzqmax
37      real newmasse
38      real sigw, Mtot, MQtot
39      integer m
40
41      REAL      SSUM,CVMGP,CVMGT
42      integer ismax,ismin
43
44
45c    On oriente tout dans le sens de la pression c'est a dire dans le
46c    sens de W
47
48      do l=2,nlay
49         do ij=1,ngrid
50            dzqw(ij,l)=q(ij,l-1)-q(ij,l)
51            adzqw(ij,l)=abs(dzqw(ij,l))
52         enddo
53      enddo
54
55      do l=2,nlay-1
56         do ij=1,ngrid
57#ifdef CRAY
58            dzq(ij,l)=0.5*
59     ,      cvmgp(dzqw(ij,l)+dzqw(ij,l+1),0.,dzqw(ij,l)*dzqw(ij,l+1))
60#else
61            if(dzqw(ij,l)*dzqw(ij,l+1).gt.0.) then
62                dzq(ij,l)=0.5*(dzqw(ij,l)+dzqw(ij,l+1))
63            else
64                dzq(ij,l)=0.
65            endif
66#endif
67            dzqmax=pente_max*min(adzqw(ij,l),adzqw(ij,l+1))
68            dzq(ij,l)=sign(min(abs(dzq(ij,l)),dzqmax),dzq(ij,l))
69         enddo
70      enddo
71
72      do ij=1,ngrid
73         dzq(ij,1)=0.
74         dzq(ij,nlay)=0.
75      enddo
76c ---------------------------------------------------------------
77c   .... calcul des termes d'advection verticale  .......
78c ---------------------------------------------------------------
79
80c calcul de  - d( q   * w )/ d(sigma)    qu'on ajoute a  dq pour calculer dq
81c
82c      No flux at the model top:
83       do ij=1,ngrid
84          wq(ij,nlay+1)=0.
85       enddo
86
87c      1) Compute wq where w > 0 (down) (ALWAYS FOR SEDIMENTATION)     
88c      ===============================
89
90       do l = 1,nlay          ! loop different than when w<0
91        do  ij = 1,ngrid
92
93         if(w(ij,l).gt.0.)then
94
95c         Regular scheme (transfered mass < 1 layer)
96c         ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
97          if(w(ij,l).le.masse(ij,l))then
98            sigw=w(ij,l)/masse(ij,l)
99            wq(ij,l)=w(ij,l)*(q(ij,l)+0.5*(1.-sigw)*dzq(ij,l))
100           
101
102c         Extended scheme (transfered mass > 1 layer)
103c         ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
104          else
105            m=l
106            Mtot = masse(ij,m)
107            MQtot = masse(ij,m)*q(ij,m)
108            if(m.ge.nlay)goto 88
109            do while(w(ij,l).gt.(Mtot+masse(ij,m+1)))
110                m=m+1
111                Mtot = Mtot + masse(ij,m)
112                MQtot = MQtot + masse(ij,m)*q(ij,m)
113                if(m.ge.nlay)goto 88
114            end do
115 88         continue
116            if (m.lt.nlay) then
117                sigw=(w(ij,l)-Mtot)/masse(ij,m+1)
118                wq(ij,l)=(MQtot + (w(ij,l)-Mtot)*
119     &          (q(ij,m+1)+0.5*(1.-sigw)*dzq(ij,m+1)) )
120            else
121                w(ij,l) = Mtot
122                wq(ij,l) = Mqtot
123            end if
124
125          end if
126         end if
127        enddo
128       enddo
129
130c      2) Compute wq where w < 0 (up) (NOT USEFUL FOR SEDIMENTATION)     
131c      ===============================
132       goto 99 ! SKIPPING THIS PART FOR SEDIMENTATION
133
134c      Surface flux up:
135       do  ij = 1,ngrid
136         if(w(ij,1).lt.0.) wq(ij,1)=0. ! warning : not always valid
137       end do
138
139       do l = 1,nlay-1  ! loop different than when w>0
140        do  ij = 1,ngrid
141         if(w(ij,l+1).le.0)then
142
143c         Regular scheme (transfered mass < 1 layer)
144c         ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
145          if(-w(ij,l+1).le.masse(ij,l))then
146            sigw=w(ij,l+1)/masse(ij,l)
147            wq(ij,l+1)=w(ij,l+1)*(q(ij,l)-0.5*(1.+sigw)*dzq(ij,l))
148c         Extended scheme (transfered mass > 1 layer)
149c         ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
150          else
151             m = l-1
152             Mtot = masse(ij,m+1)
153             MQtot = masse(ij,m+1)*q(ij,m+1)
154             if (m.le.0)goto 77
155             do while(-w(ij,l+1).gt.(Mtot+masse(ij,m)))
156                m=m-1
157                Mtot = Mtot + masse(ij,m+1)
158                MQtot = MQtot + masse(ij,m+1)*q(ij,m+1)
159                if (m.le.0)goto 77
160             end do
161 77          continue
162
163             if (m.gt.0) then
164                sigw=(w(ij,l+1)+Mtot)/masse(ij,m)
165                wq(ij,l+1)= - (MQtot + (-w(ij,l+1)-Mtot)*
166     &          (q(ij,m)-0.5*(1.+sigw)*dzq(ij,m))  )
167             else
168c               wq(ij,l+1)= (MQtot + (-w(ij,l+1)-Mtot)*qm(ij,1))
169                write(*,*) 'a rather weird situation in vlz_fi !'
170                stop
171             end if
172
173          endif
174         endif
175        enddo
176       enddo
177 99    continue
178
179      do l=1,nlay
180         do ij=1,ngrid
181
182cccccccc lines below not used for sedimentation (No real flux)
183ccccc       newmasse=masse(ij,l)+w(ij,l+1)-w(ij,l)
184ccccc       q(ij,l)=(q(ij,l)*masse(ij,l)+wq(ij,l+1)-wq(ij,l))
185ccccc&         /newmasse
186ccccc       masse(ij,l)=newmasse
187
188c            it cannot entrain more than available mass !
189            if ((wq(ij,l+1)-wq(ij,l)) .lt. -(masse(ij,l)*q(ij,l))) then
190              wq(ij,l+1) = wq(ij,l)-masse(ij,l)*q(ij,l)
191            end if
192
193            q(ij,l)=q(ij,l) +  (wq(ij,l+1)-wq(ij,l))/masse(ij,l)
194
195         enddo
196      enddo
197
198
199
200      return
201      end
Note: See TracBrowser for help on using the repository browser.