UPP  001
 All Data Structures Files Functions Pages
CALWXT_BOURG.f
Go to the documentation of this file.
1 
52 
53  subroutine calwxt_bourg_post(im,jm,jsta_2l,jend_2u,jsta,jend,lm,lp1, &
54  & iseed,g,pthresh, &
55  & t,q,pmid,pint,lmh,prec,zint,ptype,me)
56  implicit none
57 !
58 ! input:
59  integer,intent(in):: im,jm,jsta_2l,jend_2u,jsta,jend,lm,lp1,iseed,me
60  real,intent(in):: g,pthresh
61  real,intent(in), dimension(im,jsta_2l:jend_2u,lm) :: t, q, pmid
62  real,intent(in), dimension(im,jsta_2l:jend_2u,lp1) :: pint, zint
63  real,intent(in), dimension(im,jsta_2l:jend_2u) :: lmh, prec
64 !
65 ! output:
66 ! real,intent(out) :: ptype(im,jm)
67  integer,intent(out) :: ptype(im,jsta:jend)
68 !
69  integer i,j,ifrzl,iwrml,l,lhiwrm,lmhk,jlen
70  real pintk1,areane,tlmhk,areape,pintk2,surfw,area1,dzkl,psfck,r1,r2
71  real rn(im*jm*2)
72  integer :: rn_seed_size
73  integer, allocatable, dimension(:) :: rn_seed
74  logical, parameter :: debugprint = .false.
75 !
76 ! initialize weather type array to zero (ie, off).
77 ! we do this since we want ptype to represent the
78 ! instantaneous weather type on return.
79  if (debugprint) then
80  print *,'in calwxtbg, jsta,jend=',jsta,jend,' im=',im
81  print *,'in calwxtbg,me=',me,'iseed=',iseed
82  endif
83 !
84 !$omp parallel do
85  do j=jsta,jend
86  do i=1,im
87  ptype(i,j) = 0
88  enddo
89  enddo
90 !
91  jlen = jend - jsta + 1
92 
93  call random_seed(size = rn_seed_size)
94  allocate(rn_seed(rn_seed_size))
95  rn_seed = iseed
96  call random_seed(put = rn_seed)
97  call random_number(rn)
98 !
99 !!$omp parallel do &
100 ! & private(a,lmhk,tlmhk,iwrml,psfck,lhiwrm,pintk1,pintk2,area1, &
101 ! & areape,dzkl,surfw,r1,r2)
102 ! print *,'incalwxtbg, rn',maxval(rn),minval(rn)
103 
104  do j=jsta,jend
105 ! if(me==1)print *,'incalwxtbg, j=',j
106  do i=1,im
107  lmhk = min(nint(lmh(i,j)),lm)
108  psfck = pint(i,j,lmhk+1)
109 !
110  if (prec(i,j) <= pthresh) cycle ! skip this point if no precip this time step
111 
112 ! find the depth of the warm layer based at the surface
113 ! this will be the cut off point between computing
114 ! the surface based warm air and the warm air aloft
115 !
116  tlmhk = t(i,j,lmhk) ! lowest layer t
117  iwrml = lmhk + 1
118  if (tlmhk >= 273.15) then
119  do l = lmhk, 2, -1
120  if (t(i,j,l) >= 273.15 .and. t(i,j,l-1) < 273.15 .and. &
121  & iwrml == lmhk+1) iwrml = l
122  end do
123  end if
124 !
125 ! now find the highest above freezing level
126 !
127 ! gsm added 250 mb check to prevent stratospheric warming situations
128 ! from counting as warm layers aloft
129  lhiwrm = lmhk + 1
130  do l = lmhk, 1, -1
131  if (t(i,j,l) >= 273.15 .and. pmid(i,j,l) > 25000.) lhiwrm = l
132  end do
133 
134 ! energy variables
135 
136 ! surfw is the positive energy between ground and the first sub-freezing layer above ground
137 ! areane is the negative energy between ground and the highest layer above ground
138 ! that is above freezing
139 ! areape is the positive energy "aloft" which is the warm energy not based at the ground
140 ! (the total warm energy = surfw + areape)
141 !
142 ! pintk1 is the pressure at the bottom of the layer
143 ! pintk2 is the pressure at the top of the layer
144 ! dzkl is the thickness of the layer
145 ! ifrzl is a flag that tells us if we have hit a below freezing layer
146 !
147  pintk1 = psfck
148  ifrzl = 0
149  areane = 0.0
150  areape = 0.0
151  surfw = 0.0
152 
153  do l = lmhk, 1, -1
154  if (ifrzl == 0.and.t(i,j,l) <= 273.15) ifrzl = 1
155  pintk2 = pint(i,j,l)
156  dzkl = zint(i,j,l)-zint(i,j,l+1)
157  area1 = log(t(i,j,l)/273.15) * g * dzkl
158  if (t(i,j,l) >= 273.15.and. pmid(i,j,l) > 25000.) then
159  if (l < iwrml) areape = areape + area1
160  if (l >= iwrml) surfw = surfw + area1
161  else
162  if (l > lhiwrm) areane = areane + abs(area1)
163  end if
164  pintk1 = pintk2
165  end do
166 !
167 ! decision tree time
168 !
169  if (areape < 2.0) then
170 ! very little or no positive energy aloft, check for
171 ! positive energy just above the surface to determine rain vs. snow
172  if (surfw < 5.6) then
173 ! not enough positive energy just above the surface
174 ! snow = 1
175  ptype(i,j) = 1
176  else if (surfw > 13.2) then
177 ! enough positive energy just above the surface
178 ! rain = 8
179  ptype(i,j) = 8
180  else
181 ! transition zone, assume equally likely rain/snow
182 ! picking a random number, if <=0.5 snow
183  r1 = rn(i+im*(j-1))
184  if (r1 <= 0.5) then
185  ptype(i,j) = 1 ! snow = 1
186  else
187  ptype(i,j) = 8 ! rain = 8
188  end if
189  end if
190 !
191  else
192 ! some positive energy aloft, check for enough negative energy
193 ! to freeze and make ice pellets to determine ip vs. zr
194  if (areane > 66.0+0.66*areape) then
195 ! enough negative area to make ip,
196 ! now need to check if there is enough positive energy
197 ! just above the surface to melt ip to make rain
198  if (surfw < 5.6) then
199 ! not enough energy at the surface to melt ip
200  ptype(i,j) = 2 ! ice pellets = 2
201  else if (surfw > 13.2) then
202 ! enough energy at the surface to melt ip
203  ptype(i,j) = 8 ! rain = 8
204  else
205 ! transition zone, assume equally likely ip/rain
206 ! picking a random number, if <=0.5 ip
207  r1 = rn(i+im*(j-1))
208  if (r1 <= 0.5) then
209  ptype(i,j) = 2 ! ice pellets = 2
210  else
211  ptype(i,j) = 8 ! rain = 8
212  end if
213  end if
214  else if (areane < 46.0+0.66*areape) then
215 ! not enough negative energy to refreeze, check surface temp
216 ! to determine rain vs. zr
217  if (tlmhk < 273.15) then
218  ptype(i,j) = 4 ! freezing rain = 4
219  else
220  ptype(i,j) = 8 ! rain = 8
221  end if
222  else
223 ! transition zone, assume equally likely ip/zr
224 ! picking a random number, if <=0.5 ip
225  r1 = rn(i+im*(j-1))
226  if (r1 <= 0.5) then
227 ! still need to check positive energy
228 ! just above the surface to melt ip vs. rain
229  if (surfw < 5.6) then
230  ptype(i,j) = 2 ! ice pellets = 2
231  else if (surfw > 13.2) then
232  ptype(i,j) = 8 ! rain = 8
233  else
234 ! transition zone, assume equally likely ip/rain
235 ! picking a random number, if <=0.5 ip
236  r2 = rn(i+im*(j-1)+im*jm)
237  if (r2 <= 0.5) then
238  ptype(i,j) = 2 ! ice pellets = 2
239  else
240  ptype(i,j) = 8 ! rain = 8
241  end if
242  end if
243  else
244 ! not enough negative energy to refreeze, check surface temp
245 ! to determine rain vs. zr
246  if (tlmhk < 273.15) then
247  ptype(i,j) = 4 ! freezing rain = 4
248  else
249  ptype(i,j) = 8 ! rain = 8
250  end if
251  end if
252  end if
253  end if
254 ! write(1000+me,*)' finished for i, j, from calbourge me=',me,i,j
255  end do
256 ! write(1000+me,*)' finished for j, from calbourge me=',me,j
257  end do
258 ! write(1000+me,*)' returning from calbourge me=',me
259  return
260  end