30 SUBROUTINE wetfrzlvl(TWET,ZWET)
34 use vrbls3d, only: pint, zint, t
35 use vrbls2d, only: fis, thz0, ths
36 use masks, only: lmh, sm
37 use params_mod, only: gi, p1000, capa, tfrz, d0065, d50
38 use ctlblk_mod
, only: jsta, jend, im, jsta_2l, jend_2u, lm, spval
44 REAL,
intent(in) :: twet(im,jsta_2l:jend_2u,lm)
45 REAL,
intent(out) :: zwet(im,jsta:jend)
48 real htsfc,thsfc,psfc,tsfc,delz,delt,zl,zu
59 IF(fis(i,j)==spval)
THEN
71 thsfc = (sm(i,j)*thz0(i,j)+(1.-sm(i,j))*ths(i,j))
72 psfc = pint(i,j,llmh+1)
73 tsfc = thsfc*(psfc/p1000)**capa
77 zwet(i,j) = htsfc+(tsfc-tfrz)/d0065
83 loopl:
DO l = llmh,1,-1
84 IF (twet(i,j,l)<=tfrz)
THEN
86 delz = d50*(zint(i,j,l)-zint(i,j,l+2))
87 zl = d50*(zint(i,j,l+1)+zint(i,j,l+2))
88 delt = twet(i,j,l)-twet(i,j,l+1)
89 zwet(i,j) = zl + (tfrz-twet(i,j,l+1))/delt*delz
91 zu = d50*(zint(i,j,l)+zint(i,j,l+1))
94 tsfc = sm(i,j)*thz0(i,j)+(1.-sm(i,j))*ths(i,j) &
95 *(pint(i,j,nint(lmh(i,j))+1)/p1000)**capa
98 zwet(i,j) = zl + (tfrz-tsfc)/delt*delz
100 zwet(i,j) = htsfc+(tsfc-twet(i,j,l))/d0065
102 IF (zwet(i,j) > zu)
THEN
105 IF ((-1*zwet(i,j)) > zu)
THEN