UPP  001
 All Data Structures Files Functions Pages
ETAMP_Q2F.f
1  SUBROUTINE etamp_q2f(QRIMEF,QQI,QQR,QQW,CWM,F_RAIN,F_ICE,F_RIMEF,T)
2  ! This subroutine is to be used with the WRF "advected Ferrier
3  ! scheme" to calculate the F_ICE, F_RIMEF and F_RAIN arrays from
4  ! the QQW, QQR, QQI and the input array QRIMEF.
5  use ctlblk_mod, only: lm,im,jsta,jend,jsta_2l,jend_2u
6  implicit none
7 
8  real, intent(in),dimension(im,jsta_2l:jend_2u,lm) :: &
9  qrimef,qqw,qqr,qqi, t
10 
11  real, intent(out),dimension(im,jsta_2l:jend_2u,lm) :: &
12  f_rain,f_ice,f_rimef,cwm
13 
14  integer :: i,j,l
15  real :: qt
16 
17  ! NOTE: these parameters must match the WRF Ferrier scheme.
18  ! They're wrong elsewhere in the post:
19  real, parameter :: t_ice=-40., t0c=273.15, t_icek=233.15
20  real, parameter :: epsq=1.e-12
21 
22  bigl: do l=1,lm
23  bigj: do j=jsta,jend
24  bigi: do i=1,im
25  qt=qqw(i,j,l)+qqr(i,j,l)+qqi(i,j,l)
26  cwm(i,j,l)=qt
27  if(qqi(i,j,l)<=epsq) then
28  f_ice(i,j,l)=0.
29  f_rimef(i,j,l)=1.
30  if(t(i,j,l)<t_icek) f_ice(i,j,l)=1.
31  else
32  f_ice(i,j,l)=max(0.,min(1.,qqi(i,j,l)/qt))
33  f_rimef(i,j,l)=max(1.,min(100.,qrimef(i,j,l)/qqi(i,j,l)))
34  endif
35  if(qqr(i,j,l) <= epsq) then
36  f_rain(i,j,l)=0.
37  else
38  f_rain(i,j,l)=max(0.,min(1.,qqr(i,j,l)/(qqr(i,j,l)+qqw(i,j,l))))
39  endif
40  enddo bigi
41  enddo bigj
42  enddo bigl
43  END SUBROUTINE etamp_q2f