Newer
Older

WAUTELET Philippe
committed
!MNH_LIC Copyright 2020-2021 CNRS, Meteo-France and Universite Paul Sabatier

WAUTELET Philippe
committed
!MNH_LIC This is part of the Meso-NH software governed by the CeCILL-C licence
!MNH_LIC version 1. See LICENSE, CeCILL-C_V1-en.txt and CeCILL-C_V1-fr.txt
!MNH_LIC for details. version 1.
!-----------------------------------------------------------------
! Author: P. Wautelet 25/06/2020 (deduplication of code from advection_metsv, resolved_cloud and turb)
! Modifications:
! P. Wautelet 30/06/2020: remove non-local corrections in resolved_cloud for NEGA => new local corrections here

Juan Escobar
committed
! J. Escobar 21/07/2020: bug <-> array of size(:,:,:,0) => return if krr=0

WAUTELET Philippe
committed
! P. Wautelet 10/02/2021: budgets: add missing sources for NSV_C2R2BEG+3 budget

WAUTELET Philippe
committed
!-----------------------------------------------------------------
module mode_sources_neg_correct
implicit none
private
public :: Sources_neg_correct
contains
subroutine Sources_neg_correct( hcloud, hbudname, krr, ptstep, ppabst, ptht, prt, prths, prrs, prsvs, prhodj )
use modd_budget, only: lbudget_th, lbudget_rv, lbudget_rc, lbudget_rr, lbudget_ri, &
lbudget_rs, lbudget_rg, lbudget_rh, lbudget_sv, &
NBUDGET_TH, NBUDGET_RV, NBUDGET_RC, NBUDGET_RR, NBUDGET_RI, &
NBUDGET_RS, NBUDGET_RG, NBUDGET_RH, NBUDGET_SV1, &
tbudgets

WAUTELET Philippe
committed
use modd_cst, only: xci, xcl, xcpd, xcpv, xlstt, xlvtt, xp00, xrd, xtt
use modd_nsv, only: nsv_c2r2beg, nsv_c2r2end, nsv_lima_beg, nsv_lima_end, nsv_lima_nc, nsv_lima_nr,&
nsv_lima_ni, nsv_lima_ns, nsv_lima_ng, nsv_lima_nh

WAUTELET Philippe
committed
use modd_param_lima, only: lcold_lima => lcold, lrain_lima => lrain, lspro_lima => lspro, lwarm_lima => lwarm, &
xctmin_lima => xctmin, xrtmin_lima => xrtmin, nmom_c, nmom_r, nmom_i, nmom_s, nmom_g, nmom_h

WAUTELET Philippe
committed
use mode_budget, only: Budget_store_init, Budget_store_end

WAUTELET Philippe
committed
use mode_msg
implicit none
character(len=*), intent(in) :: hcloud ! Kind of cloud parameterization
character(len=*), intent(in) :: hbudname ! Budget name
integer, intent(in) :: krr ! Number of moist variables
real, intent(in) :: ptstep ! Timestep
real, dimension(:, :, :), intent(in) :: ppabst ! Absolute pressure at time t
real, dimension(:, :, :), intent(in) :: ptht ! Theta at time t
real, dimension(:, :, :, :), intent(in) :: prt ! Moist variables at time t
real, dimension(:, :, :), intent(inout) :: prths ! Source terms
real, dimension(:, :, :, :), intent(inout) :: prrs ! Source terms
real, dimension(:, :, :, :), intent(inout) :: prsvs ! Source terms
real, dimension(:, :, :), intent(in), optional :: prhodj ! Dry density * jacobian
integer :: ji, jj, jk
integer :: jr
integer :: jrmax
integer :: jsv

WAUTELET Philippe
committed
integer :: isv_lima_end

WAUTELET Philippe
committed
real, dimension(:, :, :), allocatable :: zt, zexn, zlv, zls, zcph, zcor
logical, dimension(:, :, :), allocatable :: zmask

WAUTELET Philippe
committed

Juan Escobar
committed

WAUTELET Philippe
committed
if ( hbudname /= 'NEADV' .and. hbudname /= 'NECON' .and. hbudname /= 'NEGA' .and. hbudname /= 'NETUR' ) &
call Print_msg( NVERB_WARNING, 'GEN', 'Sources_neg_correct', 'budget '//hbudname//' not yet tested' )

WAUTELET Philippe
committed
if ( hcloud == 'LIMA' ) then
! The negativity correction does not apply to the SPRO (supersaturation) variable which may be naturally negative
if ( lspro_lima ) then
isv_lima_end = nsv_lima_end - 1
else
isv_lima_end = nsv_lima_end
end if
end if
if ( hbudname /= 'NECON' .and. hbudname /= 'NEGA' ) then
if ( hcloud == 'KESS' .or. hcloud == 'ICE3' .or. hcloud == 'ICE4' .or. &
hcloud == 'KHKO' .or. hcloud == 'C2R2' .or. hcloud == 'LIMA' ) then
if ( lbudget_th ) call Budget_store_init( tbudgets(NBUDGET_TH), Trim( hbudname ), prths(:, :, :) )
if ( lbudget_rv ) call Budget_store_init( tbudgets(NBUDGET_RV), Trim( hbudname ), prrs (:, :, :, 1) )
if ( lbudget_rc ) call Budget_store_init( tbudgets(NBUDGET_RC), Trim( hbudname ), prrs (:, :, :, 2) )
if ( lbudget_rr .and. &
( hbudname /= 'NETUR' .or. &
( hbudname == 'NETUR' .and. ( hcloud == 'C2R2' .or. hcloud == 'KHKO' .or. hcloud == 'LIMA' ) ) ) ) &
call Budget_store_init( tbudgets(NBUDGET_RR), Trim( hbudname ), prrs (:, :, :, 3) )
IF (lbudget_ri .and. &
( hbudname /= 'NETUR' .or. &
( hbudname == 'NETUR' .and. ( hcloud == 'ICE3' .or. hcloud == 'ICE4' .or. hcloud == 'LIMA' ) ) ) ) &
call Budget_store_init( tbudgets(NBUDGET_RI), Trim( hbudname ), prrs (:, :, :, 4) )
if ( lbudget_rs .and. hbudname /= 'NETUR' ) call Budget_store_init( tbudgets(NBUDGET_RS), Trim( hbudname ), prrs (:, :, :, 5) )
if ( lbudget_rg .and. hbudname /= 'NETUR' ) call Budget_store_init( tbudgets(NBUDGET_RG), Trim( hbudname ), prrs (:, :, :, 6) )
if ( lbudget_rh .and. hbudname /= 'NETUR' ) call Budget_store_init( tbudgets(NBUDGET_RH), Trim( hbudname ), prrs (:, :, :, 7) )
end if
if ( lbudget_sv .and. ( hcloud == 'C2R2' .or. hcloud == 'KHKO' ) ) then

WAUTELET Philippe
committed
do ji = nsv_c2r2beg, nsv_c2r2end
call Budget_store_init( tbudgets(NBUDGET_SV1 - 1 + ji), Trim( hbudname ), prsvs(:, :, :, ji) )
end do
end if
if ( lbudget_sv .and. hcloud == 'LIMA' ) then

WAUTELET Philippe
committed
do ji = nsv_lima_beg, isv_lima_end
call Budget_store_init( tbudgets(NBUDGET_SV1 - 1 + ji), Trim( hbudname ), prsvs(:, :, :, ji) )
end do
end if
else !NECON + NEGA
if ( .not. present( prhodj ) ) &
call Print_msg( NVERB_FATAL, 'GEN', 'Sources_neg_correct', 'optional argument prhodj not present' )
if ( hcloud == 'KESS' .or. hcloud == 'ICE3' .or. hcloud == 'ICE4' .or. &
hcloud == 'KHKO' .or. hcloud == 'C2R2' .or. hcloud == 'LIMA' ) then
if ( lbudget_th) call Budget_store_init( tbudgets(NBUDGET_TH), Trim( hbudname ), prths(:, :, :) * prhodj(:, :, :) )
if ( lbudget_rv) call Budget_store_init( tbudgets(NBUDGET_RV), Trim( hbudname ), prrs (:, :, :, 1) * prhodj(:, :, :) )
if ( lbudget_rc) call Budget_store_init( tbudgets(NBUDGET_RC), Trim( hbudname ), prrs (:, :, :, 2) * prhodj(:, :, :) )
if ( lbudget_rr) call Budget_store_init( tbudgets(NBUDGET_RR), Trim( hbudname ), prrs (:, :, :, 3) * prhodj(:, :, :) )
if ( lbudget_ri) call Budget_store_init( tbudgets(NBUDGET_RI), Trim( hbudname ), prrs (:, :, :, 4) * prhodj(:, :, :) )
if ( lbudget_rs) call Budget_store_init( tbudgets(NBUDGET_RS), Trim( hbudname ), prrs (:, :, :, 5) * prhodj(:, :, :) )
if ( lbudget_rg) call Budget_store_init( tbudgets(NBUDGET_RG), Trim( hbudname ), prrs (:, :, :, 6) * prhodj(:, :, :) )
if ( lbudget_rh) call Budget_store_init( tbudgets(NBUDGET_RH), Trim( hbudname ), prrs (:, :, :, 7) * prhodj(:, :, :) )
end if
if ( lbudget_sv .and. ( hcloud == 'C2R2' .or. hcloud == 'KHKO' ) ) then

WAUTELET Philippe
committed
do ji = nsv_c2r2beg, nsv_c2r2end

WAUTELET Philippe
committed
call Budget_store_init( tbudgets(NBUDGET_SV1 - 1 + ji), Trim( hbudname ), prsvs(:, :, :, ji) * prhodj(:, :, :) )
end do
end if
if ( lbudget_sv .and. hcloud == 'LIMA' ) then

WAUTELET Philippe
committed
do ji = nsv_lima_beg, isv_lima_end

WAUTELET Philippe
committed
call Budget_store_init( tbudgets(NBUDGET_SV1 - 1 + ji), Trim( hbudname ), prsvs(:, :, :, ji) * prhodj(:, :, :) )
end do
end if
end if

WAUTELET Philippe
committed
allocate( zt ( Size( prths, 1 ), Size( prths, 2 ), Size( prths, 3 ) ) )
allocate( zexn( Size( prths, 1 ), Size( prths, 2 ), Size( prths, 3 ) ) )
allocate( zlv ( Size( prths, 1 ), Size( prths, 2 ), Size( prths, 3 ) ) )
allocate( zcph( Size( prths, 1 ), Size( prths, 2 ), Size( prths, 3 ) ) )
zexn(:, :, :) = ( ppabst(:, :, :) / xp00 ) ** (xrd / xcpd )
zt (:, :, :) = ptht(:, :, :) * zexn(:, :, :)
zlv (:, :, :) = xlvtt + ( xcpv - xcl ) * ( zt(:, :, :) - xtt )
if ( hcloud == 'ICE3' .or. hcloud == 'ICE4' .or. hcloud == 'LIMA' ) then
allocate( zls( Size( prths, 1 ), Size( prths, 2 ), Size( prths, 3 ) ) )
zls(:, :, :) = xlstt + ( xcpv - xci ) * ( zt(:, :, :) - xtt )
end if
zcph(:, :, :) = xcpd + xcpv * prt(:, :, :, 1)
deallocate( zt )
CLOUD: select case ( hcloud )
case ( 'KESS' )
jrmax = Size( prrs, 4 )

WAUTELET Philippe
committed
do jr = 2, jrmax
where ( prrs(:, :, :, jr) < 0. )
prrs(:, :, :, 1) = prrs(:, :, :, 1) + prrs(:, :, :, jr)
prths(:, :, :) = prths(:, :, :) - prrs(:, :, :, jr) * zlv(:, :, :) / &
( zcph(:, :, :) * zexn(:, :, :) )
prrs(:, :, :, jr) = 0.
end where
end do
where ( prrs(:, :, :, 1) < 0. .and. prrs(:, :, :, 2) > 0. )
prrs(:, :, :, 1) = prrs(:, :, :, 1) + prrs(:, :, :, 2)
prths(:, :, :) = prths(:, :, :) - prrs(:, :, :, 2) * zlv(:, :, :) / &
( zcph(:, :, :) * zexn(:, :, :) )
prrs(:, :, :, 2) = 0.
end where
case( 'ICE3', 'ICE4' )
if ( hbudname == 'NETUR' ) then

WAUTELET Philippe
committed
jrmax = 4
else
jrmax = Size( prrs, 4 )
end if
do jr = 4, jrmax
where ( prrs(:, :, :, jr) < 0.)
prrs(:, :, :, 1) = prrs(:, :, :, 1) + prrs(:, :, :, jr)
prths(:, :, :) = prths(:, :, :) - prrs(:, :, :, jr) * zls(:, :, :) / &
( zcph(:, :, :) * zexn(:, :, :) )
prrs(:, :, :, jr) = 0.
end where
end do
!
! cloud
if ( hbudname == 'NETUR' ) then

WAUTELET Philippe
committed
184
185
186
187
188
189
190
191
192
193
194
195
196
197
198
199
200
201
202
203
204
205
206
207
208
209
210
211
212
213
214
215
216
217
218
219
220
221
222
223
224
225
226
227
228
229
230
231
232
233
234
235
236
237
238
239
jrmax = 2
else
jrmax = 3
end if
do jr = 2, jrmax
where ( prrs(:, :, :, jr) < 0.)
prrs(:, :, :, 1) = prrs(:, :, :, 1) + prrs(:, :, :, jr)
prths(:, :, :) = prths(:, :, :) - prrs(:, :, :, jr) * zlv(:, :, :) / &
( zcph(:, :, :) * zexn(:, :, :) )
prrs(:, :, :, jr) = 0.
end where
end do
!
! if rc or ri are positive, we can correct negative rv
! cloud
where ( prrs(:, :, :, 1) < 0. .and. prrs(:, :, :, 2) > 0. )
prrs(:, :, :, 1) = prrs(:, :, :, 1) + prrs(:, :, :, 2)
prths(:, :, :) = prths(:, :, :) - prrs(:, :, :, 2) * zlv(:, :, :) / &
( zcph(:, :, :) * zexn(:, :, :) )
prrs(:, :, :, 2) = 0.
end where
! ice
if ( krr > 3 ) then
allocate( zcor( Size( prths, 1 ), Size( prths, 2 ), Size( prths, 3 ) ) )
where ( prrs(:, :, :, 1) < 0. .and. prrs(:, :, :, 4) > 0. )
zcor(:, :, :) = Min( -prrs(:, :, :, 1), prrs(:, :, :, 4) )
prrs(:, :, :, 1) = prrs(:, :, :, 1) + zcor(:, :, :)
prths(:, :, :) = prths(:, :, :) - zcor(:, :, :) * zls(:, :, :) / &
( zcph(:, :, :) * zexn(:, :, :) )
prrs(:, :, :, 4) = prrs(:, :, :, 4) - zcor(:, :, :)
end where
end if
!
!
case( 'C2R2', 'KHKO' )
where ( prrs(:, :, :, 2) < 0. .or. prsvs(:, :, :, nsv_c2r2beg + 1) < 0. )
prsvs(:, :, :, nsv_c2r2beg) = 0.
end where
do jsv = 2, 3
where ( prrs(:, :, :, jsv) < 0. .or. prsvs(:, :, :, nsv_c2r2beg - 1 + jsv) < 0. )
prrs(:, :, :, 1) = prrs(:, :, :, 1) + prrs(:, :, :, jsv)
prths(:, :, :) = prths(:, :, :) - prrs(:, :, :, jsv) * zlv(:, :, :) / &
( zcph(:, :, :) * zexn(:, :, :) )
prrs(:, :, :, jsv) = 0.
prsvs(:, :, :, nsv_c2r2beg - 1 + jsv) = 0.
end where
end do
where ( prrs(:, :, :, 1) < 0. .and. prrs(:, :, :, 2) > 0. )
prrs(:, :, :, 1) = prrs(:, :, :, 1) + prrs(:, :, :, 2)
prths(:, :, :) = prths(:, :, :) - prrs(:, :, :, 2) * zlv(:, :, :) / &
( zcph(:, :, :) * zexn(:, :, :) )
prrs(:, :, :, 2) = 0.
prsvs(:, :, :, nsv_c2r2beg + 1) = 0.
end where
!
!
allocate( zmask ( Size( prths, 1 ), Size( prths, 2 ), Size( prths, 3 ) ) )

WAUTELET Philippe
committed
! Correction where rc<0 or Nc<0
if ( krr.GE.2 ) then
zmask(:,:,:)=(prrs(:, :, :, 2) < xrtmin_lima(2) / ptstep)
if (nmom_c.ge.2) zmask(:,:,:)=(zmask(:,:,:) .or. prsvs(:, :, :, nsv_lima_nc) < 0. )
where ( zmask(:,:,:) )
prrs(:, :, :, 1) = prrs(:, :, :, 1) + prrs(:, :, :, 2)
prths(:, :, :) = prths(:, :, :) - prrs(:, :, :, 2) * zlv(:, :, :) / &
( zcph(:, :, :) * zexn(:, :, :) )
prrs(:, :, :, 2) = 0.
end where
where ( prrs(:, :, :, 1) < 0. .and. prrs(:, :, :, 2) > 0. )
prrs(:, :, :, 1) = prrs(:, :, :, 1) + prrs(:, :, :, 2)
prths(:, :, :) = prths(:, :, :) - prrs(:, :, :, 2) * zlv(:, :, :) / &
( zcph(:, :, :) * zexn(:, :, :) )
prrs(:, :, :, 2) = 0.
end where
if (nmom_c.ge.2) then
where (prrs(:, :, :, 2) == 0.) prsvs(:, :, :, nsv_lima_nc) = 0.
end if
end if

WAUTELET Philippe
committed
! Correction where rr<0 or Nr<0
if ( krr.GE.3 ) then
zmask(:,:,:)=(prrs(:, :, :, 3) < xrtmin_lima(3) / ptstep)
if (nmom_r.ge.2) zmask(:,:,:)=(zmask(:,:,:) .or. prsvs(:, :, :, nsv_lima_nr) < 0. )
where ( zmask(:,:,:) )
prrs(:, :, :, 1) = prrs(:, :, :, 1) + prrs(:, :, :, 3)
prths(:, :, :) = prths(:, :, :) - prrs(:, :, :, 3) * zlv(:, :, :) / &
( zcph(:, :, :) * zexn(:, :, :) )
prrs(:, :, :, 3) = 0.
end where
if (nmom_r.ge.2) then
where (prrs(:, :, :, 3) == 0.) prsvs(:, :, :, nsv_lima_nr) = 0.
end if
end if

WAUTELET Philippe
committed
! Correction where ri<0 or Ni<0
if ( krr.GE.4 ) then
zmask(:,:,:)=(prrs(:, :, :, 4) < xrtmin_lima(4) / ptstep)
if (nmom_i.ge.2) zmask(:,:,:)=(zmask(:,:,:) .or. prsvs(:, :, :, nsv_lima_ni) < 0. )
where ( zmask(:,:,:) )
prrs(:, :, :, 1) = prrs(:, :, :, 1) + prrs(:, :, :, 4)
prths(:, :, :) = prths(:, :, :) - prrs(:, :, :, 4) * zls(:, :, :) / &
( zcph(:, :, :) * zexn(:, :, :) )
prrs(:, :, :, 4) = 0.
end where
end if
if(krr > 3) then

WAUTELET Philippe
committed
allocate( zcor( Size( prths, 1 ), Size( prths, 2 ), Size( prths, 3 ) ) )
where ( prrs(:, :, :, 1) < 0. .and. prrs(:, :, :, 4) > 0. )
zcor(:, :, :) = Min( -prrs(:, :, :, 1), prrs(:, :, :, 4) )
prrs(:, :, :, 1) = prrs(:, :, :, 1) + zcor(:, :, :)
prths(:, :, :) = prths(:, :, :) - zcor(:, :, :) * zls(:, :, :) / &
( zcph(:, :, :) * zexn(:, :, :) )
prrs(:, :, :, 4) = prrs(:, :, :, 4) - zcor(:, :, :)

WAUTELET Philippe
committed
end where
deallocate( zcor )
297
298
299
300
301
302
303
304
305
306
307
308
309
310
311
312
313
314
315
316
317
318
319
320
321
322
323
324
325
326
327
328
329
330
331
332
333
334
335
336
337
338
339
340
341
342
343
end if
if (nmom_i.ge.2) then
where (prrs(:, :, :, 4) == 0.) prsvs(:, :, :, nsv_lima_ni) = 0.
end if
! Snow
if ( krr.GE.5 ) then
zmask(:,:,:)=(prrs(:, :, :, 5) < xrtmin_lima(5) / ptstep)
if (nmom_s.ge.2) zmask(:,:,:)=(zmask(:,:,:) .or. prsvs(:, :, :, nsv_lima_ns) < 0. )
where ( zmask(:,:,:) )
prrs(:, :, :, 1) = prrs(:, :, :, 1) + prrs(:, :, :, 5)
prths(:, :, :) = prths(:, :, :) - prrs(:, :, :, 5) * zls(:, :, :) / &
( zcph(:, :, :) * zexn(:, :, :) )
prrs(:, :, :, 5) = 0.
end where
end if
if (nmom_s.ge.2) then
where (prrs(:, :, :, 5) == 0.) prsvs(:, :, :, nsv_lima_ns) = 0.
end if
! Graupel
if ( krr.GE.6 ) then
zmask(:,:,:)=(prrs(:, :, :, 6) < xrtmin_lima(6) / ptstep)
if (nmom_g.ge.2) zmask(:,:,:)=(zmask(:,:,:) .or. prsvs(:, :, :, nsv_lima_ng) < 0. )
where ( zmask(:,:,:) )
prrs(:, :, :, 1) = prrs(:, :, :, 1) + prrs(:, :, :, 6)
prths(:, :, :) = prths(:, :, :) - prrs(:, :, :, 6) * zls(:, :, :) / &
( zcph(:, :, :) * zexn(:, :, :) )
prrs(:, :, :, 6) = 0.
end where
end if
if (nmom_g.ge.2) then
where (prrs(:, :, :, 6) == 0.) prsvs(:, :, :, nsv_lima_ng) = 0.
end if
! Hail
if ( krr.GE.7 ) then
zmask(:,:,:)=(prrs(:, :, :, 7) < xrtmin_lima(7) / ptstep)
if (nmom_h.ge.2) zmask(:,:,:)=(zmask(:,:,:) .or. prsvs(:, :, :, nsv_lima_nh) < 0. )
where ( zmask(:,:,:) )
prrs(:, :, :, 1) = prrs(:, :, :, 1) + prrs(:, :, :, 7)
prths(:, :, :) = prths(:, :, :) - prrs(:, :, :, 7) * zls(:, :, :) / &
( zcph(:, :, :) * zexn(:, :, :) )
prrs(:, :, :, 7) = 0.
end where
end if
if (nmom_h.ge.2) then
where (prrs(:, :, :, 7) == 0.) prsvs(:, :, :, nsv_lima_nh) = 0.
end if
!

WAUTELET Philippe
committed
prsvs(:, :, :, nsv_lima_beg : isv_lima_end) = Max( 0.0, prsvs(:, :, :, nsv_lima_beg : isv_lima_end) )
deallocate(zmask)

WAUTELET Philippe
committed
end select CLOUD

WAUTELET Philippe
committed
if ( hbudname /= 'NECON' .and. hbudname /= 'NEGA' ) then
if ( hcloud == 'KESS' .or. hcloud == 'ICE3' .or. hcloud == 'ICE4' .or. &
hcloud == 'KHKO' .or. hcloud == 'C2R2' .or. hcloud == 'LIMA' ) then
if ( lbudget_th ) call Budget_store_end( tbudgets(NBUDGET_TH), Trim( hbudname ), prths(:, :, :) )
if ( lbudget_rv ) call Budget_store_end( tbudgets(NBUDGET_RV), Trim( hbudname ), prrs (:, :, :, 1) )
if ( lbudget_rc ) call Budget_store_end( tbudgets(NBUDGET_RC), Trim( hbudname ), prrs (:, :, :, 2) )

WAUTELET Philippe
committed
if ( lbudget_rr .and. &
( hbudname /= 'NETUR' .or. &
( hbudname == 'NETUR' .and. ( hcloud == 'C2R2' .or. hcloud == 'KHKO' .or. hcloud == 'LIMA' ) ) ) ) &
call Budget_store_end( tbudgets(NBUDGET_RR), Trim( hbudname ), prrs (:, :, :, 3) )
IF (lbudget_ri .and. &

WAUTELET Philippe
committed
( hbudname /= 'NETUR' .or. &
( hbudname == 'NETUR' .and. ( hcloud == 'ICE3' .or. hcloud == 'ICE4' .or. hcloud == 'LIMA' ) ) ) ) &
call Budget_store_end( tbudgets(NBUDGET_RI), Trim( hbudname ), prrs (:, :, :, 4) )
if ( lbudget_rs .and. hbudname /= 'NETUR' ) call Budget_store_end( tbudgets(NBUDGET_RS), Trim( hbudname ), prrs (:, :, :, 5) )
if ( lbudget_rg .and. hbudname /= 'NETUR' ) call Budget_store_end( tbudgets(NBUDGET_RG), Trim( hbudname ), prrs (:, :, :, 6) )
if ( lbudget_rh .and. hbudname /= 'NETUR' ) call Budget_store_end( tbudgets(NBUDGET_RH), Trim( hbudname ), prrs (:, :, :, 7) )
end if

WAUTELET Philippe
committed
if ( lbudget_sv .and. ( hcloud == 'C2R2' .or. hcloud == 'KHKO' ) ) then

WAUTELET Philippe
committed
do ji = nsv_c2r2beg, nsv_c2r2end
call Budget_store_end( tbudgets(NBUDGET_SV1 - 1 + ji), Trim( hbudname ), prsvs(:, :, :, ji) )

WAUTELET Philippe
committed
end do
end if
if ( lbudget_sv .and. hcloud == 'LIMA' ) then

WAUTELET Philippe
committed
do ji = nsv_lima_beg, isv_lima_end
call Budget_store_end( tbudgets(NBUDGET_SV1 - 1 + ji), Trim( hbudname ), prsvs(:, :, :, ji) )

WAUTELET Philippe
committed
end do
end if
else !NECON + NEGA
if ( hcloud == 'KESS' .or. hcloud == 'ICE3' .or. hcloud == 'ICE4' .or. &
hcloud == 'KHKO' .or. hcloud == 'C2R2' .or. hcloud == 'LIMA' ) then
if ( lbudget_th) call Budget_store_end( tbudgets(NBUDGET_TH), Trim( hbudname ), prths(:, :, :) * prhodj(:, :, :) )
if ( lbudget_rv) call Budget_store_end( tbudgets(NBUDGET_RV), Trim( hbudname ), prrs (:, :, :, 1) * prhodj(:, :, :) )
if ( lbudget_rc) call Budget_store_end( tbudgets(NBUDGET_RC), Trim( hbudname ), prrs (:, :, :, 2) * prhodj(:, :, :) )
if ( lbudget_rr) call Budget_store_end( tbudgets(NBUDGET_RR), Trim( hbudname ), prrs (:, :, :, 3) * prhodj(:, :, :) )
if ( lbudget_ri) call Budget_store_end( tbudgets(NBUDGET_RI), Trim( hbudname ), prrs (:, :, :, 4) * prhodj(:, :, :) )
if ( lbudget_rs) call Budget_store_end( tbudgets(NBUDGET_RS), Trim( hbudname ), prrs (:, :, :, 5) * prhodj(:, :, :) )
if ( lbudget_rg) call Budget_store_end( tbudgets(NBUDGET_RG), Trim( hbudname ), prrs (:, :, :, 6) * prhodj(:, :, :) )
if ( lbudget_rh) call Budget_store_end( tbudgets(NBUDGET_RH), Trim( hbudname ), prrs (:, :, :, 7) * prhodj(:, :, :) )

WAUTELET Philippe
committed
end if
if ( lbudget_sv .and. ( hcloud == 'C2R2' .or. hcloud == 'KHKO' ) ) then

WAUTELET Philippe
committed
do ji = nsv_c2r2beg, nsv_c2r2end

WAUTELET Philippe
committed
call Budget_store_end( tbudgets(NBUDGET_SV1 - 1 + ji), Trim( hbudname ), prsvs(:, :, :, ji) * prhodj(:, :, :) )

WAUTELET Philippe
committed
end do
end if
if ( lbudget_sv .and. hcloud == 'LIMA' ) then

WAUTELET Philippe
committed
do ji = nsv_lima_beg, isv_lima_end

WAUTELET Philippe
committed
call Budget_store_end( tbudgets(NBUDGET_SV1 - 1 + ji), Trim( hbudname ), prsvs(:, :, :, ji) * prhodj(:, :, :) )

WAUTELET Philippe
committed
end do
end if
end if
end subroutine Sources_neg_correct
end module mode_sources_neg_correct