27 SUBROUTINE calpblregime(PBLREGIME)
30 use vrbls3d, only: uh, vh, pmid, t, q, pint, zmid, zint
31 use vrbls2d, only: ths, qs, smstav, twbs, qwbs, pblh
33 use params_mod, only: p1000, capa, d608, h1, g, rd, cp
34 use ctlblk_mod
, only: jsta, jend, spval, lm, jsta_m, jend_m, im, &
36 use gridspec_mod
, only: gridtype
42 REAL ,
PARAMETER :: vconvc=1.
46 REAL,
dimension(IM,jsta_2l:jend_2u),
intent(inout) :: pblregime
48 integer i,j,ie,iw,ii,jj
49 real ape,thv,thvx,govrth,umass,vmass,wspd,tskv,dthv,rhox,fluxc,tsfc, &
61 pblregime(i,j) = spval
81 IF(gridtype /=
'A')
THEN
82 call exch(uh(1,jsta_2l,lm))
83 call exch(vh(1,jsta_2l,lm))
89 IF(pmid(i,j,lm)<spval .AND. qs(i,j)<spval .AND. &
90 smstav(i,j)<spval)
THEN
91 ape = (p1000/pmid(i,j,lm))**capa
93 thvx = (q(i,j,lm)*d608+h1)*thx
95 IF(gridtype ==
'E')
THEN
98 umass = (uh(i,j-1,lm)+uh(iw,j,lm)+uh(ie,j,lm) &
100 vmass = (vh(i,j-1,lm)+vh(iw,j,lm)+vh(ie,j,lm) &
102 wspd= sqrt(umass*umass+vmass*vmass)
103 ELSE IF(gridtype ==
'B')
THEN
106 umass = (uh(iw,j-1,lm)+uh(iw,j,lm)+uh(ie,j-1,lm) &
108 vmass = (vh(iw,j-1,lm)+vh(iw,j,lm)+vh(ie,j-1,lm) &
110 wspd= sqrt(umass*umass+vmass*vmass)
112 wspd = sqrt(uh(i,j,lm)*uh(i,j,lm)+vh(i,j,lm)*vh(i,j,lm))
115 tskv = ths(i,j)*(1.+d608*qs(i,j)*smstav(i,j))
121 rhox = pint(i,j,lm+1)/rd/(t(i,j,lm)*(q(i,j,lm)*d608+h1))
122 fluxc = max(-twbs(i,j)/rhox/cp - d608*tskv*qwbs(i,j)/rhox,0.)
123 tsfc = ths(i,j)*(pint(i,j,lm+1)/p1000)**capa
124 vconv = vconvc*(g/tsfc*pblh(i,j)*fluxc)**.33
126 vsgd = 0.32 * (max(dx(i,j)/5000.-1.,0.))**.33
127 wspd = sqrt(wspd*wspd+vconv*vconv+vsgd*vsgd)
129 br = govrth*(zmid(i,j,lm)-zint(i,j,lm+1))*dthv/(wspd*wspd)
133 ELSE IF(br == 0.0)
THEN
135 ELSE IF(br < 0.2)
THEN