UPP  001
 All Data Structures Files Functions Pages
CALMICT.f
Go to the documentation of this file.
1 
35  SUBROUTINE calmict_new(P1D,T1D,Q1D,C1D,FI1D,FR1D,FS1D,CUREFL, &
36  qw1,qi1,qr1,qs1,dbz1,dbzr1,dbzi1,dbzc1,nlice1,nrain1)
37 
38 !
39  use params_mod, only: dbzmin, epsq, tfrz, eps, rd, d608
40  use ctlblk_mod, only: jsta, jend, jsta_2l,jend_2u,im
41  use cmassi_mod, only: t_ice, rqr_drmin, n0rmin, cn0r_dmrmin, &
42  mdrmin, rqr_drmax, cn0r_dmrmax, mdrmax, n0r0, xmrmin, &
43  xmrmax, massi, cn0r0, mdimin, xmimax, mdimax
44 !- - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - -
45  implicit none
46 !
47  INTEGER indexs, indexr
48 !aligo
49  REAL, PARAMETER :: cice=1.634e13, cwet=1./.189, cboth=cice/.224, &
50  & NLI_min=1.E3, RFmax=45.259, RQmix=0.1E-3,NSI_max=250.E3
51 !aligo
52  real,dimension(IM,jsta_2l:jend_2u),intent(in) :: p1d,t1d,q1d,c1d,fi1d,fr1d, &
53  fs1d,curefl
54  real,dimension(IM,jsta_2l:jend_2u),intent(inout) :: qw1,qi1,qr1,qs1,dbz1,dbzr1,&
55  dbzi1,dbzc1,nlice1,nrain1
56 
57  integer i,j
58  real :: tc,frain,fice,rimef,xsimass,qice,qsat,esat,wv,rho,rrho, &
59  & RQR,DRmm,Qsigrd,WVQW,Dum,XLi,Qlice,WC,DLI,NLImax,NSImax, &
60  & RQLICE, N0r,Ztot,Zrain,Zice,Zconv,Zmin,Zmix,NLICE,NSmICE, &
61  & QSmICE,NRAIN,NMIX,Zsmice
62  logical :: large_rf, hail
63  real,external :: fpvs
64 !************************************************************************
65 !--- Determine composition of condensate in the form of cloud water,
66 ! total ice (cloud ice & snow), & rain following GSMDRIVE in NMM model
67 !
68  zmin=10.**(0.1*dbzmin)
69  DO j=jsta,jend
70  DO i=1,im
71  qw1(i,j)=0.
72  qi1(i,j)=0.
73  qr1(i,j)=0.
74  qs1(i,j)=0.
75  nlice1(i,j)=0.
76  nrain1(i,j)=0.
77  dbz1(i,j)=dbzmin
78  dbzr1(i,j)=dbzmin
79  dbzi1(i,j)=dbzmin
80  dbzc1(i,j)=dbzmin
81  ENDDO
82  ENDDO
83  DO j=jsta,jend
84  DO i=1,im
85  ztot=0. !--- Total radar reflectivity
86  zrain=0. !--- Radar reflectivity from rain
87  zice=0. !--- Radar reflectivity from ice
88  zsmice=0. !--- Radar reflectivity from small ice
89  zconv=curefl(i,j) !--- Radar reflectivity from convection
90  IF (c1d(i,j) <= epsq) THEN
91 !
92 !--- Skip rest of calculatiions if no condensate is present
93 !
94  go to 10
95  ELSE
96  wc=c1d(i,j)
97  ENDIF
98 !
99 !--- Code below is from GSMDRIVE for determining:
100 ! QI1 - total ice (cloud ice & snow) mixing ratio
101 ! QW1 - cloud water mixing ratio
102 ! QR1 - rain mixing ratio
103 !
104  tc=t1d(i,j)-tfrz
105  fice=fi1d(i,j)
106  frain=fr1d(i,j)
107  IF (tc<=t_ice .OR. fice>=1.) THEN
108 ! IF (Fice>=1.) THEN
109  qi1(i,j)=wc
110  ELSE IF (fice <= 0.) THEN
111  qw1(i,j)=wc
112  ELSE
113  qi1(i,j)=fice*wc
114  qw1(i,j)=wc-qi1(i,j)
115  ENDIF
116  IF (qw1(i,j)>0. .AND. frain>0.) THEN
117  IF (frain >= 1.) THEN
118  qr1(i,j)=qw1(i,j)
119  qw1(i,j)=0.
120  ELSE
121  qr1(i,j)=frain*qw1(i,j)
122  qw1(i,j)=qw1(i,j)-qr1(i,j)
123  ENDIF
124  ENDIF
125  wv=q1d(i,j)/(1.-q1d(i,j))
126 !
127 !--- Saturation vapor pressure w/r/t water ( >=0C ) or ice ( <0C )
128 !
129  esat=1000.*fpvs(t1d(i,j))
130  qsat=eps*esat/(p1d(i,j)-esat)
131  rho=p1d(i,j)/(rd*t1d(i,j)*(1.+d608*q1d(i,j)))
132  rrho=1./rho
133  !
134  !--- Based on code from GSMCOLUMN in model to determine reflectivity from rain
135  !
136  rqr=0.
137  IF (qr1(i,j) > epsq) THEN
138  rqr=rho*qr1(i,j)
139  IF (rqr <= rqr_drmin) THEN
140  n0r=max(n0rmin, cn0r_dmrmin*rqr)
141  indexr=mdrmin
142  ELSE IF (rqr >= rqr_drmax) THEN
143  n0r=cn0r_dmrmax*rqr
144  indexr=mdrmax
145  ELSE
146  n0r=n0r0
147  indexr=max( xmrmin, min(cn0r0*rqr**.25, xmrmax) )
148  ENDIF
149  !
150  !--- INDEXR is the mean drop size in microns; convert to mm
151  !
152  drmm=1.e-3*REAL(indexr)
153  !
154  !--- Number concentration of rain drops (convert INDEXR to m)
155  !
156  nrain=n0r*1.e-6*REAL(indexr)
157  nrain1(i,j)=nrain
158  zrain=0.72*n0r*drmm*drmm*drmm*drmm*drmm*drmm*drmm
159  ENDIF !--- End IF (QR1(I,J) > EPSQ) block
160 !
161 !--- Based on code from GSMCOLUMN in model to determine partition of
162 ! total ice into cloud ice & snow (precipitation ice)
163 !
164  rqlice=0.
165  IF (qi1(i,j) > epsq) THEN
166  qice=qi1(i,j)
167 !
168 ! -> Small ice particles are assumed to have a mean diameter of 50 microns.
169 ! * INDEXS - mean size of snow to the nearest micron (units of microns)
170 ! * RimeF - Rime Factor, which is the mass ratio of total (unrimed &
171 ! rimed) ice mass to the unrimed ice mass (>=1)
172 ! * QTICE - time-averaged mixing ratio of total ice
173 ! * QLICE - mixing ratio of large ice
174 ! * RQLICE - mass content of large ice
175 ! * NLICE1 - time-averaged number concentration of large ice
176 !
177  IF (tc>=0.) THEN
178  !
179  !--- Eliminate small ice particle contributions for melting & sublimation
180  !
181  nsmice=0.
182  qsmice=0.
183  ELSE
184 !
185 !--- Max # conc of small ice crystals based on 10% of total ice content
186 !
187 ! NSImax=0.1*RHO*QICE/MASSI(MDImin)
188 !aligo
189  nsimax=max(nsi_max,0.1*rho*qice/massi(mdimin) )
190 !aligo
191 !
192 !-- Specify Fletcher, Cooper, Meyers, etc. here for ice nuclei concentrations
193 !
194  nsmice=min(0.01*exp(-0.6*tc), nsimax) !- Fletcher (1962)
195  dum=rrho*massi(mdimin)
196  nsmice=min(nsmice, qice/dum)
197  qsmice=nsmice*dum
198  ENDIF ! End IF (TC>=0.) THEN
199  qlice=max(0., qice-qsmice)
200  qs1(i,j)=qlice
201  qi1(i,j)=qsmice
202  rimef=amax1(1., fs1d(i,j) )
203  rimef=min(rimef, rfmax)
204  rqlice=rho*qlice
205  dum=xmimax*exp(.0536*tc)
206  indexs=min(mdimax, max(mdimin, int(dum) ) )
207 !
208 !-- Specify NLImax depending on presence of high density ice (rime factors >10)
209 !
210  IF (rimef>10.) THEN
211  large_rf=.true. !-- For convective precipitation
212  nlimax=1.e3
213  ELSE
214  large_rf=.false. !-- For non-convective precipitation
215  dum=max(tc, t_ice)
216  nlimax=10.e3*exp(-0.017*dum)
217  ENDIF
218  nlice=rqlice/(rimef*massi(indexs))
219  dum=nli_min*massi(mdimin) !-- Minimum large ice mixing ratio
220 new_nlice: IF (rqlice<dum) THEN
221  nlice=rqlice/massi(mdimin)
222  ELSE IF (nlice<nli_min .OR. nlice>nlimax) THEN new_nlice
223 !
224 !--- Force NLICE to be between NLI_min and NLImax, but allow for exceptions
225 !
226  hail=.false.
227  nlice=max(nli_min, min(nlimax, nlice) )
228  xli=rqlice/(nlice*rimef)
229 new_size: IF (xli <= massi(mdimin) ) THEN
230  indexs=mdimin
231  ELSE IF (xli <= massi(450) ) THEN new_size
232  dli=9.5885e5*xli**.42066 ! DLI in microns
233  indexs=min(mdimax, max(mdimin, int(dli) ) )
234  ELSE IF (xli <= massi(mdimax) ) THEN new_size
235  dli=3.9751e6*xli**.49870 ! DLI in microns
236  indexs=min(mdimax, max(mdimin, int(dli) ) )
237  ELSE new_size
238  indexs=mdimax
239  IF (large_rf) hail=.true.
240  ENDIF new_size
241 no_hail: IF (.NOT. hail) THEN
242  nlice=rqlice/(rimef*massi(indexs)) !-- NLICE > NLImax
243  ENDIF no_hail
244  ENDIF new_nlice
245  nlice1(i,j)=nlice
246  !
247  !--- Equation (C.8) in Ferrier (1994, JAS, p. 272), which when
248  ! converted from cgs units to mks units results in the same
249  ! value for Cice, which is equal to the {} term below:
250  !
251  ! Zi={.224*720*(10**18)/[(PI*RHOL)**2]}*(RHO*QLICE)**2/NLICE1(I,J),
252  ! where RHOL=1000 kg/m**3 is the density of liquid water
253  !
254  !--- Valid only for exponential ice distributions
255  !
256  IF (nsmice > 0.) THEN
257  zsmice=cice*rho*rho*qsmice*qsmice/nsmice
258  ENDIF
259  if (nlice1(i,j) /= 0.0) zice=cice*rqlice*rqlice/nlice1(i,j)
260  IF (tc>=0.) zice=cwet*zice ! increased for wet ice
261  ENDIF ! End IF (QI1(I,J) > 0.) THEN
262 !
263 !--- Assumed enhanced radar reflectivity when rain and ice coexist
264 ! above an assumed threshold mass content, RQmix
265 !
266 dbz_mix: IF (rqr>rqmix .AND. rqlice>rqmix) THEN
267  IF (rqr>rqlice) THEN
268  nmix=nrain
269  ELSE
270  nmix=nlice1(i,j)
271  ENDIF
272  dum=rqr+rqlice
273  zmix=cboth*dum*dum/nmix
274  IF (zmix > zrain+zice) THEN
275  IF (rqr>rqlice) THEN
276  zrain=zmix-zice
277  ELSE
278  zice=zmix-zrain
279  ENDIF
280  ENDIF
281  ENDIF dbz_mix
282 !
283 !--- Calculate total (convective + grid-scale) radar reflectivity
284 !
285 10 zice=zice+zsmice
286  ztot=zrain+zice+zconv
287  IF (ztot > zmin) dbz1(i,j)= 10.*alog10(ztot)
288  IF (zrain > zmin) dbzr1(i,j)=10.*alog10(zrain)
289  IF (zice > zmin) dbzi1(i,j)=10.*alog10(zice)
290 ! IF (Zconv > Zmin) DBZC1(I,J)=10.*ALOG10(Zsmice)
291  IF (zconv > zmin) dbzc1(i,j)=10.*alog10(zconv)
292  ENDDO
293  ENDDO
294 !
295  RETURN
296  END
297 !
298 !-- For the old version of the microphysics:
299 !
300  SUBROUTINE calmict_old(P1D,T1D,Q1D,C1D,FI1D,FR1D,FS1D,CUREFL, &
301  qw1,qi1,qr1,qs1,dbz1,dbzr1,dbzi1,dbzc1,nlice1,nrain1)
335  use params_mod, only: dbzmin, epsq, tfrz, eps, rd, d608, oneps, nlimin
336  use ctlblk_mod, only: jsta, jend, jsta_2l, jend_2u, im
337  use rhgrd_mod, only: rhgrd
338  use cmassi_mod, only: t_ice, rqr_drmin, n0rmin, cn0r_dmrmin, mdrmin, &
339  rqr_drmax,cn0r_dmrmax, mdrmax, n0r0, xmrmin, xmrmax,flarge2, &
340  massi, cn0r0, mdimin, xmimax, mdimax,nlimax
341 !- - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - -
342  implicit none
343 !
344  INTEGER indexs, indexr
345  REAL, PARAMETER :: cice=1.634e13
346 
347  real,dimension(IM,jsta_2l:jend_2u),intent(in) :: p1d,t1d,q1d,c1d,fi1d,fr1d, &
348  fs1d,curefl
349  real,dimension(IM,jsta_2l:jend_2u),intent(inout) :: qw1,qi1,qr1,qs1,dbz1,dbzr1,&
350  dbzi1,dbzc1,nlice1,nrain1
351 
352  REAL n0r,ztot,zrain,zice,zconv,zmin
353  integer i,j
354  real tc, frain,fice,flimass,flarge, &
355  fsmall,rimef,xsimass,qice,qsat,esat,wv,rho,rrho,rqr, &
356  drmm,qsigrd,wvqw,dum,xli,qlice,wc,dli,xlimass
357  real,external :: fpvs
358 !************************************************************************
359 !--- Determine composition of condensate in the form of cloud water,
360 ! total ice (cloud ice & snow), & rain following GSMDRIVE in NMM model
361 !
362  zmin=10.**(0.1*dbzmin)
363  DO j=jsta,jend
364  DO i=1,im
365  qw1(i,j)=0.
366  qi1(i,j)=0.
367  qr1(i,j)=0.
368  qs1(i,j)=0.
369  nlice1(i,j)=0.
370  nrain1(i,j)=0.
371  dbz1(i,j)=dbzmin
372  dbzr1(i,j)=dbzmin
373  dbzi1(i,j)=dbzmin
374  dbzc1(i,j)=dbzmin
375  ENDDO
376  ENDDO
377  DO j=jsta,jend
378  DO i=1,im
379  zrain=0. !--- Radar reflectivity from rain
380  zice=0. !--- Radar reflectivity from ice
381  zconv=curefl(i,j) !--- Radar reflectivity from convection
382  IF (c1d(i,j) <= epsq) THEN
383 !
384 !--- Skip rest of calculatiions if no condensate is present
385 !
386  go to 10
387  ELSE
388  wc=c1d(i,j)
389  ENDIF
390 !
391 !--- Code below is from GSMDRIVE for determining:
392 ! QI1 - total ice (cloud ice & snow) mixing ratio
393 ! QW1 - cloud water mixing ratio
394 ! QR1 - rain mixing ratio
395 !
396  tc=t1d(i,j)-tfrz
397  fice=fi1d(i,j)
398  frain=fr1d(i,j)
399  IF (tc<=t_ice .OR. fice>=1.) THEN
400 ! IF (Fice>=1.) THEN
401  qi1(i,j)=wc
402  ELSE IF (fice <= 0.) THEN
403  qw1(i,j)=wc
404  ELSE
405  qi1(i,j)=fice*wc
406  qw1(i,j)=wc-qi1(i,j)
407  ENDIF
408  IF (qw1(i,j)>0. .AND. frain>0.) THEN
409  IF (frain >= 1.) THEN
410  qr1(i,j)=qw1(i,j)
411  qw1(i,j)=0.
412  ELSE
413  qr1(i,j)=frain*qw1(i,j)
414  qw1(i,j)=qw1(i,j)-qr1(i,j)
415  ENDIF
416  ENDIF
417  wv=q1d(i,j)/(1.-q1d(i,j))
418 !
419 !--- Saturation vapor pressure w/r/t water ( >=0C ) or ice ( <0C )
420 !
421  esat=1000.*fpvs(t1d(i,j))
422  qsat=eps*esat/(p1d(i,j)-esat)
423  rho=p1d(i,j)/(rd*t1d(i,j)*(1.+d608*q1d(i,j)))
424  rrho=1./rho
425  !
426  !--- Based on code from GSMCOLUMN in model to determine reflectivity from rain
427  !
428  IF (qr1(i,j) > epsq) THEN
429  rqr=rho*qr1(i,j)
430  IF (rqr <= rqr_drmin) THEN
431  n0r=max(n0rmin, cn0r_dmrmin*rqr)
432  indexr=mdrmin
433  ELSE IF (rqr >= rqr_drmax) THEN
434  n0r=cn0r_dmrmax*rqr
435  indexr=mdrmax
436  ELSE
437  n0r=n0r0
438  indexr=max( xmrmin, min(cn0r0*rqr**.25, xmrmax) )
439  ENDIF
440  !
441  !--- INDEXR is the mean drop size in microns; convert to mm
442  !
443  drmm=1.e-3*REAL(indexr)
444  zrain=0.72*n0r*drmm*drmm*drmm*drmm*drmm*drmm*drmm
445  !
446  !--- Number concentration of rain drops (convert INDEXR to m)
447  !
448  nrain1(i,j)=n0r*1.e-6*REAL(indexr)
449  ENDIF !--- End IF (QR1(I,J) > EPSQ) block
450 !
451 !--- Based on code from GSMCOLUMN in model to determine partition of
452 ! total ice into cloud ice & snow (precipitation ice)
453 !
454  IF (qi1(i,j) > epsq) THEN
455  qice=qi1(i,j)
456  rho=p1d(i,j)/(rd*t1d(i,j)*(1.+oneps*q1d(i,j)))
457  rrho=1./rho
458  qsigrd=rhgrd*qsat
459  wvqw=wv+qw1(i,j)
460 !
461 ! * FLARGE - ratio of number of large ice to total (large & small) ice
462 ! * FSMALL - ratio of number of small ice crystals to large ice particles
463 ! -> Small ice particles are assumed to have a mean diameter of 50 microns.
464 ! * XSIMASS - used for calculating small ice mixing ratio
465 ! * XLIMASS - used for calculating large ice mixing ratio
466 ! * INDEXS - mean size of snow to the nearest micron (units of microns)
467 ! * RimeF - Rime Factor, which is the mass ratio of total (unrimed &
468 ! rimed) ice mass to the unrimed ice mass (>=1)
469 ! * FLIMASS - mass fraction of large ice
470 ! * QTICE - time-averaged mixing ratio of total ice
471 ! * QLICE - time-averaged mixing ratio of large ice
472 ! * NLICE1 - time-averaged number concentration of large ice
473 !
474  IF (tc>=0. .OR. wvqw<qsigrd) THEN
475  flarge=1.
476  ELSE
477  flarge=flarge2 !-- specified in MICROINIT.f
478 !! IF (TC>=-8. .AND. TC<=-3.) FLARGE=.5*FLARGE
479  ENDIF
480  fsmall=(1.-flarge)/flarge
481  xsimass=rrho*massi(mdimin)*fsmall
482  dum=xmimax*exp(.0536*tc)
483  indexs=min(mdimax, max(mdimin, int(dum) ) )
484  rimef=amax1(1., fs1d(i,j) )
485  xlimass=rrho*rimef*massi(indexs)
486  flimass=xlimass/(xlimass+xsimass)
487  qlice=flimass*qice
488  nlice1(i,j)=qlice/xlimass
489  IF (nlice1(i,j)<nlimin .OR. nlice1(i,j)>nlimax) THEN
490 !
491 !--- Force NLICE1 to be between NLImin and NLImax
492 !
493  dum=max(nlimin, min(nlimax, nlice1(i,j)) )
494  xli=rho*(qice/dum-xsimass)/rimef
495  IF (xli <= massi(mdimin) ) THEN
496  indexs=mdimin
497  ELSE IF (xli <= massi(450) ) THEN
498  dli=9.5885e5*xli**.42066 ! DLI in microns
499  indexs=min(mdimax, max(mdimin, int(dli) ) )
500  ELSE IF (xli <= massi(mdimax) ) THEN
501  dli=3.9751e6*xli**.49870 ! DLI in microns
502  indexs=min(mdimax, max(mdimin, int(dli) ) )
503  ELSE
504  indexs=mdimax
505 !
506 !--- 8/22/01: Increase density of large ice if maximum limits
507 ! are reached for number concentration (NLImax) and mean size
508 ! (MDImax). Done to increase fall out of ice.
509 !
510  IF (dum >= nlimax) &
511  rimef=rho*(qice/nlimax-xsimass)/massi(indexs)
512  ENDIF ! End IF (XLI <= MASSI(MDImin) )
513  xlimass=rrho*rimef*massi(indexs)
514  flimass=xlimass/(xlimass+xsimass)
515  qlice=flimass*qice
516  nlice1(i,j)=qlice/xlimass
517  ENDIF ! End IF (NLICE<NLImin ...
518  qs1(i,j)=amin1(qi1(i,j), qlice)
519  qi1(i,j)=amax1(0., qi1(i,j)-qs1(i,j))
520  !
521  !--- Equation (C.8) in Ferrier (1994, JAS, p. 272), which when
522  ! converted from cgs units to mks units results in the same
523  ! value for Cice, which is equal to the {} term below:
524  !
525  ! Zi={.224*720*(10**18)/[(PI*RHOL)**2]}*(RHO*QLICE)**2/NLICE1(I,J),
526  ! where RHOL=1000 kg/m**3 is the density of liquid water
527  !
528  !--- Valid only for exponential ice distributions
529  !
530  zice=cice*rho*rho*qlice*qlice/nlice1(i,j)
531  ENDIF ! End IF (QI1(I,J) > 0.) THEN
532 !
533 !--- Calculate total (convective + grid-scale) radar reflectivity
534 10 ztot=zrain+zice+zconv
535  IF (ztot > zmin) dbz1(i,j)= 10.*alog10(ztot)
536  IF (zrain > zmin) dbzr1(i,j)=10.*alog10(zrain)
537  IF (zice > zmin) dbzi1(i,j)=10.*alog10(zice)
538  IF (zconv > zmin) dbzc1(i,j)=10.*alog10(zconv)
539  ENDDO
540  ENDDO
541 !
542  RETURN
543  END