Newer
Older

WAUTELET Philippe
committed
!MNH_LIC Copyright 1995-2021 CNRS, Meteo-France and Universite Paul Sabatier
!MNH_LIC This is part of the Meso-NH software governed by the CeCILL-C licence

WAUTELET Philippe
committed
!MNH_LIC version 1. See LICENSE, CeCILL-C_V1-en.txt and CeCILL-C_V1-fr.txt
!MNH_LIC for details. version 1.
!-----------------------------------------------------------------

WAUTELET Philippe
committed
! Modifications:
! P. Wautelet 17/08/2020: add Budget_preallocate subroutine
!-----------------------------------------------------------------

WAUTELET Philippe
committed
module mode_ini_budget
implicit none
private

WAUTELET Philippe
committed
public :: Budget_preallocate, Ini_budget

WAUTELET Philippe
committed
contains

WAUTELET Philippe
committed
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
subroutine Budget_preallocate()
use modd_budget, only: nbudgets, tbudgets, &
NBUDGET_U, NBUDGET_V, NBUDGET_W, NBUDGET_TH, NBUDGET_TKE, &
NBUDGET_RV, NBUDGET_RC, NBUDGET_RR, NBUDGET_RI, NBUDGET_RS, &
NBUDGET_RG, NBUDGET_RH, NBUDGET_SV1
use modd_nsv, only: nsv
use mode_msg
character(len=3) :: ybudgetnum
integer :: ibudget
integer :: jsv
call Print_msg( NVERB_DEBUG, 'BUD', 'Budget_preallocate', 'called' )
if ( allocated( tbudgets ) ) then
call Print_msg( NVERB_WARNING, 'BUD', 'Budget_preallocate', 'tbudgets already allocated' )
return
end if
nbudgets = NBUDGET_SV1 - 1 + nsv
allocate( tbudgets( nbudgets ) )
tbudgets(NBUDGET_U)%cname = "BU_RU"
tbudgets(NBUDGET_U)%ccomment = "Budget for U"
tbudgets(NBUDGET_U)%nid = NBUDGET_U
tbudgets(NBUDGET_V)%cname = "BU_RV"
tbudgets(NBUDGET_V)%ccomment = "Budget for V"
tbudgets(NBUDGET_V)%nid = NBUDGET_V
tbudgets(NBUDGET_W)%cname = "BU_RW"
tbudgets(NBUDGET_W)%ccomment = "Budget for W"
tbudgets(NBUDGET_W)%nid = NBUDGET_W
tbudgets(NBUDGET_TH)%cname = "BU_RTH"
tbudgets(NBUDGET_TH)%ccomment = "Budget for potential temperature"
tbudgets(NBUDGET_TH)%nid = NBUDGET_TH
tbudgets(NBUDGET_TKE)%cname = "BU_RTKE"
tbudgets(NBUDGET_TKE)%ccomment = "Budget for turbulent kinetic energy"
tbudgets(NBUDGET_TKE)%nid = NBUDGET_TKE
tbudgets(NBUDGET_RV)%cname = "BU_RRV"
tbudgets(NBUDGET_RV)%ccomment = "Budget for water vapor mixing ratio"
tbudgets(NBUDGET_RV)%nid = NBUDGET_RV
tbudgets(NBUDGET_RC)%cname = "BU_RRC"
tbudgets(NBUDGET_RC)%ccomment = "Budget for cloud water mixing ratio"
tbudgets(NBUDGET_RC)%nid = NBUDGET_RC
tbudgets(NBUDGET_RR)%cname = "BU_RRR"
tbudgets(NBUDGET_RR)%ccomment = "Budget for rain water mixing ratio"
tbudgets(NBUDGET_RR)%nid = NBUDGET_RR
tbudgets(NBUDGET_RI)%cname = "BU_RRI"
tbudgets(NBUDGET_RI)%ccomment = "Budget for cloud ice mixing ratio"
tbudgets(NBUDGET_RI)%nid = NBUDGET_RI
tbudgets(NBUDGET_RS)%cname = "BU_RRS"
tbudgets(NBUDGET_RS)%ccomment = "Budget for snow/aggregate mixing ratio"
tbudgets(NBUDGET_RS)%nid = NBUDGET_RS
tbudgets(NBUDGET_RG)%cname = "BU_RRG"
tbudgets(NBUDGET_RG)%ccomment = "Budget for graupel mixing ratio"
tbudgets(NBUDGET_RG)%nid = NBUDGET_RG
tbudgets(NBUDGET_RH)%cname = "BU_RRH"
tbudgets(NBUDGET_RH)%ccomment = "Budget for hail mixing ratio"
tbudgets(NBUDGET_RH)%nid = NBUDGET_RH
do jsv = 1, nsv
ibudget = NBUDGET_SV1 - 1 + jsv
write ( ybudgetnum, '( i3.3 )' ) jsv
tbudgets(ibudget)%cname = 'BU_RSV_' // ybudgetnum
tbudgets(ibudget)%ccomment = 'Budget for scalar variable ' // ybudgetnum
tbudgets(ibudget)%nid = ibudget
end do
end subroutine Budget_preallocate
! #################################################################
SUBROUTINE Ini_budget(KLUOUT,PTSTEP,KSV,KRR, &
ONUMDIFU,ONUMDIFTH,ONUMDIFSV, &
OHORELAX_UVWTH,OHORELAX_RV,OHORELAX_RC,OHORELAX_RR, &
OHORELAX_RI,OHORELAX_RS, OHORELAX_RG, OHORELAX_RH,OHORELAX_TKE, &
OHORELAX_SV, OVE_RELAX, ove_relax_grd, OCHTRANS, &
ONUDGING,ODRAGTREE,ODEPOTREE, &
111
112
113
114
115
116
117
118
119
120
121
122
123
124
125
126
127
128
129
130
131
132
133
134
135
136
! #################################################################
!
!!**** *INI_BUDGET* - routine to initialize the parameters for the budgets
!!
!! PURPOSE
!! -------
! The purpose of this routine is to set or compute the parameters used
! by the MESONH budgets. Names of files for budget recording are processed
! and storage arrays are initialized.
!
!!** METHOD
!! ------
!! The essential of information is passed by modules. The choice of budgets
!! and processes set by the user as integers is converted in "actions"
!! readable by the subroutine BUDGET under the form of string characters.
!! For each complete process composed of several elementary processes, names
!! of elementary processes are concatenated in order to have an explicit name
!! in the comment of the recording file for budget.
!!
!!
!! EXTERNAL
!! --------
!! None
!!
!! IMPLICIT ARGUMENTS
!! ------------------
!! Modules MODD_*
!!
!! REFERENCE
!! ---------
!! Book2 of documentation (routine INI_BUDGET)
!!
!!
!! AUTHOR
!! ------
!! P. Hereil * Meteo France *
!!
!! MODIFICATIONS
!! -------------
!! Original 01/03/95
!! J. Stein 25/06/95 put the sources in phase with the code
!! J. Stein 20/07/95 reset to FALSE of all the switches when
!! CBUTYPE /= MASK or CART
!! J. Stein 26/06/96 add the new sources + add the increment between
!! 2 active processes
!! J.-P. Pinty 13/12/96 Allowance of multiple SVs
!! J.-P. Pinty 11/01/97 Includes deep convection ice and forcing processes
!! J.-P. Lafore 10/02/98 Allocation of the RHODJs for budget
!! V. Ducrocq 04/06/99 //
!! N. Asencio 18/06/99 // MASK case : delete KIMAX and KJMAX arguments,
!! GET_DIM_EXT_ll initializes the dimensions of the
!! extended local domain.

WAUTELET Philippe
committed
!! LBU_MASK and NBUSURF are allocated on the extended
!! local domain.
!! add 3 local variables IBUDIM1,IBUDIM2,IBUDIM3
!! to define the dimensions of the budget arrays
!! in the different cases CART and MASK
!! J.-P. Pinty 23/09/00 add budget for C2R2
!! V. Masson 18/11/02 add budget for 2way nesting
!! O.Geoffroy 03/2006 Add KHKO scheme
!! J.-P. Pinty 22/04/97 add the explicit hail processes
!! C.Lac 10/08/07 Add ADV for PPM without contribution
!! of each direction
!! C. Barthe 19/11/09 Add atmospheric electricity
!! C.Lac 01/07/11 Add vegetation drag
!! P. Peyrille, M. Tomasini : include in the forcing term the 2D forcing
!! terms in term 2DFRC search for modif PP . but Not very clean!

Gaelle Tanguy
committed
!! C .Lac 27/05/14 add negative corrections for chemical species
!! C.Lac 29/01/15 Correction for NSV_USER

ESCOBAR MUNOZ Juan
committed
!! J.Escobar 02/10/2015 modif for JPHEXT(JPVEXT) variable
!! C.Lac 04/12/15 Correction for LSUPSAT

WAUTELET Philippe
committed
! C. Lac 04/2016: negative contribution to the budget split between advection, turbulence and microphysics for KHKO/C2R2
! C. Barthe 01/2016: add budget for LIMA
! C. Lac 10/2016: add budget for droplet deposition
! S. Riette 11/2016: new budgets for ICE3/ICE4
! P. Wautelet 05/2016-04/2018: new data structures and calls for I/O
! P. Wautelet 10/04/2019: replace ABORT and STOP calls by Print_msg
! P. Wautelet 15/11/2019: remove unused CBURECORD variable
! P. Wautelet 24/02/2020: bugfix: corrected condition for budget NCDEPITH

WAUTELET Philippe
committed
! P. Wautelet 26/02/2020: bugfix: rename CEVA->REVA for budget for raindrop evaporation in C2R2 (necessary after commit 4ed805fc)

WAUTELET Philippe
committed
! P. Wautelet 26/02/2020: bugfix: add missing condition on OCOLD for NSEDIRH budget in LIMA case
! P. Wautelet 02-03/2020: use the new data structures and subroutines for budgets
! B. Vie 02/03/2020: LIMA negativity checks after turbulence, advection and microphysics budgets
! P .Wautelet 09/03/2020: add missing budgets for electricity

WAUTELET Philippe
committed
! P. Wautelet 25/03/2020: add missing ove_relax_grd
! P. Wautelet 23/04/2020: add nid in tbudgetdata datatype

WAUTELET Philippe
committed
! P. Wautelet + Benoit Vié 11/06/2020: improve removal of negative scalar variables + adapt the corresponding budgets
! P. Wautelet 30/06/2020: use NADVSV when possible

WAUTELET Philippe
committed
! P. Wautelet 30/06/2020: add NNETURSV, NNEADVSV and NNECONSV variables

WAUTELET Philippe
committed
! P. Wautelet 06/07/2020: bugfix: add condition on HTURB for NETUR sources for SV budgets

WAUTELET Philippe
committed
! P. Wautelet 08/12/2020: add nbusubwrite and nbutotwrite

WAUTELET Philippe
committed
! P. Wautelet 11/01/2021: ignore xbuwri for cartesian boxes (write at every xbulen interval)
! P. Wautelet 01/02/2021: bugfix: add missing CEDS source terms for SV budgets
! P. Wautelet 02/02/2021: budgets: add missing source terms for SV budgets in LIMA
! P. Wautelet 03/02/2021: budgets: add new source if LIMA splitting: CORR2
! P. Wautelet 10/02/2021: budgets: add missing sources for NSV_C2R2BEG+3 budget

WAUTELET Philippe
committed
! P. Wautelet 11/02/2021: budgets: add missing term SCAV for NSV_LIMA_SCAVMASS budget
! P. Wautelet 02/03/2021: budgets: add terms for blowing snow
! P. Wautelet 04/03/2021: budgets: add terms for drag due to buildings
!-------------------------------------------------------------------------------
!
!* 0. DECLARATIONS
! ------------
!
use modd_2d_frc, only: l2d_adv_frc, l2d_rel_frc
use modd_blowsnow, only: lblowsnow
use modd_blowsnow_n, only: lsnowsubl
use modd_budget
use modd_ch_aerosol, only: lorilam
use modd_conf, only: l1d, lcartesian, lforcing, lthinshell, nmodel
use modd_dragbldg_n, only: ldragbldg
use modd_dust, only: ldust
use modd_dyn, only: lcorio, xseglen
use modd_dyn_n, only: xtstep
use modd_elec_descr, only: linductive, lrelax2fw_ion
use modd_field, only: TYPEREAL

WAUTELET Philippe
committed
use modd_nsv, only: nsv_aerbeg, nsv_aerend, nsv_aerdepbeg, nsv_aerdepend, nsv_c2r2beg, nsv_c2r2end, &
nsv_chembeg, nsv_chemend, nsv_chicbeg, nsv_chicend, nsv_csbeg, nsv_csend, &
nsv_dstbeg, nsv_dstend, nsv_dstdepbeg, nsv_dstdepend, nsv_elecbeg, nsv_elecend, &
#ifdef MNH_FOREFIRE
nsv_ffbeg, nsv_ffend, &
#endif
nsv_lgbeg, nsv_lgend, &
nsv_lima_beg, nsv_lima_end, nsv_lima_ccn_acti, nsv_lima_ccn_free, nsv_lima_hom_haze, &
nsv_lima_ifn_free, nsv_lima_ifn_nucl, nsv_lima_imm_nucl, &
nsv_lima_nc, nsv_lima_nr, nsv_lima_ni, nsv_lima_scavmass, &

WAUTELET Philippe
committed
nsv_lnoxbeg, nsv_lnoxend, nsv_ppbeg, nsv_ppend, &
nsv_sltbeg, nsv_sltend, nsv_sltdepbeg, nsv_sltdepend, nsv_snwbeg, nsv_snwend, &
nsv_user
use modd_parameters, only: jphext
use modd_param_c2r2, only: ldepoc_c2r2 => ldepoc, lrain_c2r2 => lrain, lsedc_c2r2 => lsedc, lsupsat_c2r2 => lsupsat
use modd_param_ice, only: ladj_after, ladj_before, ldeposc_ice => ldeposc, lred, lsedic_ice => lsedic, lwarm_ice => lwarm
use modd_param_n, only: cactccn, celec

WAUTELET Philippe
committed
use modd_param_lima, only: laero_mass_lima => laero_mass, lacti_lima => lacti, lcold_lima => lcold, ldepoc_lima => ldepoc, &
lhail_lima => lhail, lhhoni_lima => lhhoni, lmeyers_lima => lmeyers, lnucl_lima => lnucl, &
lptsplit, &
lrain_lima => lrain, lscav_lima => lscav, lsedc_lima => lsedc, lsedi_lima => lsedi, &
lsnow_lima => lsnow, lwarm_lima => lwarm, &
nmod_ccn, nmod_ifn, nmod_imm
use modd_salt, only: lsalt
use modd_viscosity, only: lvisc, lvisc_r, lvisc_sv, lvisc_th, lvisc_uvw

WAUTELET Philippe
committed
USE MODE_MSG
IMPLICIT NONE
!
!* 0.1 declarations of argument
!
!
INTEGER, INTENT(IN) :: KLUOUT ! Logical unit number for prints
REAL, INTENT(IN) :: PTSTEP ! time step
263
264
265
266
267
268
269
270
271
272
273
274
275
276
277
278
279
280
281
282
283
284
285
286
287
288
INTEGER, INTENT(IN) :: KSV ! number of scalar variables
INTEGER, INTENT(IN) :: KRR ! number of moist variables
LOGICAL, INTENT(IN) :: ONUMDIFU ! switch to activate the numerical
! diffusion for momentum
LOGICAL, INTENT(IN) :: ONUMDIFTH ! for meteorological scalar variables
LOGICAL, INTENT(IN) :: ONUMDIFSV ! for tracer scalar variables
LOGICAL, INTENT(IN) :: OHORELAX_UVWTH ! switch for the
! horizontal relaxation for U,V,W,TH
LOGICAL, INTENT(IN) :: OHORELAX_RV ! switch for the
! horizontal relaxation for Rv
LOGICAL, INTENT(IN) :: OHORELAX_RC ! switch for the
! horizontal relaxation for Rc
LOGICAL, INTENT(IN) :: OHORELAX_RR ! switch for the
! horizontal relaxation for Rr
LOGICAL, INTENT(IN) :: OHORELAX_RI ! switch for the
! horizontal relaxation for Ri
LOGICAL, INTENT(IN) :: OHORELAX_RS ! switch for the
! horizontal relaxation for Rs
LOGICAL, INTENT(IN) :: OHORELAX_RG ! switch for the
! horizontal relaxation for Rg
LOGICAL, INTENT(IN) :: OHORELAX_RH ! switch for the
! horizontal relaxation for Rh
LOGICAL, INTENT(IN) :: OHORELAX_TKE ! switch for the
! horizontal relaxation for tke
LOGICAL,DIMENSION(:),INTENT(IN):: OHORELAX_SV ! switch for the
! horizontal relaxation for scalar variables
LOGICAL, INTENT(IN) :: OVE_RELAX ! switch to activate the vertical
logical, intent(in) :: ove_relax_grd ! switch to activate the vertical
! relaxation to the lowest verticals
LOGICAL, INTENT(IN) :: OCHTRANS ! switch to activate convective
!transport for SV
LOGICAL, INTENT(IN) :: ONUDGING ! switch to activate nudging
LOGICAL, INTENT(IN) :: ODRAGTREE ! switch to activate vegetation drag
LOGICAL, INTENT(IN) :: ODEPOTREE ! switch to activate droplet deposition on tree
CHARACTER (LEN=*), INTENT(IN) :: HRAD ! type of the radiation scheme
CHARACTER (LEN=*), INTENT(IN) :: HDCONV ! type of the deep convection scheme
CHARACTER (LEN=*), INTENT(IN) :: HSCONV ! type of the shallow convection scheme
CHARACTER (LEN=*), INTENT(IN) :: HTURB ! type of the turbulence scheme
CHARACTER (LEN=*), INTENT(IN) :: HTURBDIM! dimensionnality of the turbulence
! scheme
CHARACTER (LEN=*), INTENT(IN) :: HCLOUD ! type of microphysical scheme
!
!* 0.2 declarations of local variables
real, parameter :: ITOL = 1e-6
INTEGER :: JI, JJ, JK , JJJ ! loop indices
INTEGER :: IIMAX_ll, IJMAX_ll ! size of the physical global domain
INTEGER :: IIU, IJU ! size along x and y directions
! of the extended subdomain
INTEGER :: IBUDIM1 ! first dimension of the budget arrays
! = NBUIMAX in CART case
! = NBUKMAX in MASK case
INTEGER :: IBUDIM2 ! second dimension of the budget arrays
! = NBUJMAX in CART case
! = nbusubwrite in MASK case
INTEGER :: IBUDIM3 ! third dimension of the budget arrays
! = NBUKMAX in CART case
! = NBUMASK in MASK case
character(len=3) :: ybudgetnum
INTEGER :: JSV ! loop indice for the SVs
INTEGER :: IINFO_ll ! return status of the interface routine
integer :: ibudget
integer :: isourcesmax ! Maximum number of source terms in a budget
integer :: igroup
logical :: gcond
logical :: gtmp

WAUTELET Philippe
committed
type(tbusourcedata) :: tzsource ! Used to prepare metadate of source terms
call Print_msg( NVERB_DEBUG, 'BUD', 'Ini_budget', 'called' )
!
!* 1. COMPUTE BUDGET VARIABLES
! ------------------------
!
NBUSTEP = NINT (XBULEN / PTSTEP)
NBUTSHIFT=0
!
! common dimension for all CBUTYPE values
!
IF (LBU_KCP) THEN
NBUKMAX = 1
ELSE
NBUKMAX = NBUKH - NBUKL +1
END IF
!
if ( cbutype == 'CART' .or. cbutype == 'MASK' ) then
!Check if xbulen is a multiple of xtstep (within tolerance)
if ( Abs( Nint( xbulen / xtstep ) * xtstep - xbulen ) > ( ITOL * xtstep ) ) &
call Print_msg( NVERB_WARNING, 'BUD', 'Ini_budget', 'xbulen is not a multiple of xtstep' )

WAUTELET Philippe
committed
if ( cbutype == 'CART' ) then
!Check if xseglen is a multiple of xbulen (within tolerance)
if ( Abs( Nint( xseglen / xbulen ) * xbulen - xseglen ) > ( ITOL * xseglen ) ) &
call Print_msg( NVERB_WARNING, 'BUD', 'Ini_budget', 'xseglen is not a multiple of xbulen' )

WAUTELET Philippe
committed
!Write cartesian budgets every xbulen time period (do not take xbuwri into account)
xbuwri = xbulen
nbusubwrite = 1 !Number of budget time average periods for each write
nbutotwrite = nbusubwrite * Nint( xseglen / xbulen ) !Total number of budget time average periods

WAUTELET Philippe
committed
else if ( cbutype == 'MASK' ) then
!Check if xbuwri is a multiple of xtstep (within tolerance)
if ( Abs( Nint( xbuwri / xtstep ) * xtstep - xbuwri ) > ( ITOL * xtstep ) ) &
call Print_msg( NVERB_WARNING, 'BUD', 'Ini_budget', 'xbuwri is not a multiple of xtstep' )

WAUTELET Philippe
committed
!Check if xbuwri is a multiple of xbulen (within tolerance)
if ( Abs( Nint( xbuwri / xbulen ) * xbulen - xbuwri ) > ( ITOL * xbulen ) ) &
call Print_msg( NVERB_WARNING, 'BUD', 'Ini_budget', 'xbuwri is not a multiple of xbulen' )

WAUTELET Philippe
committed
!Check if xseglen is a multiple of xbuwri (within tolerance)
if ( Abs( Nint( xseglen / xbuwri ) * xbuwri - xseglen ) > ( ITOL * xseglen ) ) &
call Print_msg( NVERB_WARNING, 'BUD', 'Ini_budget', 'xseglen is not a multiple of xbuwri' )
nbusubwrite = Nint ( xbuwri / xbulen ) !Number of budget time average periods for each write
nbutotwrite = nbusubwrite * Nint( xseglen / xbuwri ) !Total number of budget time average periods

WAUTELET Philippe
committed
end if
end if
IF (CBUTYPE=='CART') THEN ! cartesian case only
!
IF ( NBUIH < NBUIL ) CALL Print_msg( NVERB_ERROR, 'BUD', 'Ini_budget', 'NBUIH < NBUIL' )
IF (LBU_ICP) THEN
NBUIMAX_ll = 1
ELSE
NBUIMAX_ll = NBUIH - NBUIL +1
END IF
IF ( NBUJH < NBUJL ) CALL Print_msg( NVERB_ERROR, 'BUD', 'Ini_budget', 'NBUJH < NBUJL' )
IF (LBU_JCP) THEN
NBUJMAX_ll = 1
ELSE
NBUJMAX_ll = NBUJH - NBUJL +1
END IF
IF ( NBUKH < NBUKL ) CALL Print_msg( NVERB_ERROR, 'BUD', 'Ini_budget', 'NBUKH < NBUKL' )

ESCOBAR MUNOZ Juan
committed
CALL GET_INTERSECTION_ll(NBUIL+JPHEXT,NBUJL+JPHEXT,NBUIH+JPHEXT,NBUJH+JPHEXT, &
401
402
403
404
405
406
407
408
409
410
411
412
413
414
415
416
417
418
419
420
421
422
423
424
425
426
427
428
429
430
431
432
433
NBUSIL,NBUSJL,NBUSIH,NBUSJH,"PHYS",IINFO_ll)
IF ( IINFO_ll /= 1 ) THEN !
IF (LBU_ICP) THEN
NBUIMAX = 1
ELSE
NBUIMAX = NBUSIH - NBUSIL +1
END IF
IF (LBU_JCP) THEN
NBUJMAX = 1
ELSE
NBUJMAX = NBUSJH - NBUSJL +1
END IF
ELSE ! the intersection is void
CBUTYPE='SKIP' ! no budget on this processor
NBUIMAX = 0 ! in order to allocate void arrays
NBUJMAX = 0
ENDIF
! three first dimensions of budget arrays in cart and skip cases
IBUDIM1=NBUIMAX
IBUDIM2=NBUJMAX
IBUDIM3=NBUKMAX
! these variables are not be used
NBUMASK=-1
!
ELSEIF (CBUTYPE=='MASK') THEN ! mask case only
!
LBU_ENABLE=.TRUE.
! result on the FM_FILE
NBUTIME = 1
CALL GET_DIM_EXT_ll ('B', IIU,IJU)
ALLOCATE( LBU_MASK( IIU ,IJU, NBUMASK) )
LBU_MASK(:,:,:)=.FALSE.

WAUTELET Philippe
committed
ALLOCATE( NBUSURF( IIU, IJU, NBUMASK, nbusubwrite) )
NBUSURF(:,:,:,:) = 0
!
! three first dimensions of budget arrays in mask case
! the order of the dimensions are the order expected in WRITE_DIACHRO routine:
! x,y,z,time,mask,processus and in this case x and y are missing
! first dimension of the arrays : dimension along K
! second dimension of the arrays : number of the budget time period
! third dimension of the arrays : number of the budget masks zones
IBUDIM1=NBUKMAX
IBUDIM2=nbusubwrite
445
446
447
448
449
450
451
452
453
454
455
456
457
458
459
460
461
462
463
464
465
466
467
468
469
470
471
472
473
474
475
476
477
478
479
480
481
482
483
484
485
486
487
488
489
490
491
492
493
494
495
IBUDIM3=NBUMASK
! these variables are not used in this case
NBUIMAX=-1
NBUJMAX=-1
! the beginning and the end along x and y direction : global extended domain
! get dimensions of the physical global domain
CALL GET_GLOBALDIMS_ll (IIMAX_ll,IJMAX_ll)
NBUIL=1
NBUIH=IIMAX_ll + 2 * JPHEXT
NBUJL=1
NBUJH=IJMAX_ll + 2 * JPHEXT
!
ELSE ! default case
!
LBU_ENABLE=.FALSE.
NBUIMAX = -1
NBUJMAX = -1
LBU_RU = .FALSE.
LBU_RV = .FALSE.
LBU_RW = .FALSE.
LBU_RTH= .FALSE.
LBU_RTKE= .FALSE.
LBU_RRV= .FALSE.
LBU_RRC= .FALSE.
LBU_RRR= .FALSE.
LBU_RRI= .FALSE.
LBU_RRS= .FALSE.
LBU_RRG= .FALSE.
LBU_RRH= .FALSE.
LBU_RSV= .FALSE.
!
! three first dimensions of budget arrays in default case
IBUDIM1=0
IBUDIM2=0
IBUDIM3=0
!
END IF
!
!
!-------------------------------------------------------------------------------
!
!* 2. ALLOCATE MEMORY FOR BUDGET ARRAYS AND INITIALIZE
! ------------------------------------------------
!
LBU_BEG =.TRUE.
!
!-------------------------------------------------------------------------------
!
!* 3. INITALIZE VARIABLES
! -------------------
!
!Create intermediate variable to store rhodj for scalar variables
if ( lbu_rth .or. lbu_rtke .or. lbu_rrv .or. lbu_rrc .or. lbu_rrr .or. &
lbu_rri .or. lbu_rrs .or. lbu_rrg .or. lbu_rrh .or. lbu_rsv ) then
allocate( tburhodj )
tburhodj%cmnhname = 'RhodJS'
tburhodj%cstdname = ''
tburhodj%clongname = 'RhodJS'
tburhodj%cunits = 'kg'
tburhodj%ccomment = 'RhodJ for Scalars variables'
tburhodj%ngrid = 1
tburhodj%ntype = TYPEREAL
tburhodj%ndims = 3
allocate( tburhodj%xdata(ibudim1, ibudim2, ibudim3) )
tburhodj%xdata(:, :, :) = 0.
end if

WAUTELET Philippe
committed
tzsource%ntype = TYPEREAL
tzsource%ndims = 3

WAUTELET Philippe
committed
! Budget of RU
tbudgets(NBUDGET_U)%lenabled = lbu_ru
if ( lbu_ru ) then

WAUTELET Philippe
committed
allocate( tbudgets(NBUDGET_U)%trhodj )

WAUTELET Philippe
committed
tbudgets(NBUDGET_U)%trhodj%cmnhname = 'RhodJX'
tbudgets(NBUDGET_U)%trhodj%cstdname = ''
tbudgets(NBUDGET_U)%trhodj%clongname = 'RhodJX'
tbudgets(NBUDGET_U)%trhodj%cunits = 'kg'
tbudgets(NBUDGET_U)%trhodj%ccomment = 'RhodJ for momentum along X axis'
tbudgets(NBUDGET_U)%trhodj%ngrid = 2
tbudgets(NBUDGET_U)%trhodj%ntype = TYPEREAL
tbudgets(NBUDGET_U)%trhodj%ndims = 3

WAUTELET Philippe
committed
allocate( tbudgets(NBUDGET_U)%trhodj%xdata(ibudim1, ibudim2, ibudim3) )
tbudgets(NBUDGET_U)%trhodj%xdata(:, :, :) = 0.

WAUTELET Philippe
committed
!Allocate all basic source terms (used or not)
!The size should be large enough (bigger than necessary is OK)
isourcesmax = 19

WAUTELET Philippe
committed
tbudgets(NBUDGET_U)%nsourcesmax = isourcesmax
allocate( tbudgets(NBUDGET_U)%tsources(isourcesmax) )

WAUTELET Philippe
committed
allocate( tbudgets(NBUDGET_U)%xtmpstore(ibudim1, ibudim2, ibudim3) )

WAUTELET Philippe
committed
tbudgets(NBUDGET_U)%tsources(:)%ngroup = 0

WAUTELET Philippe
committed
tzsource%ccomment = 'Budget of momentum along X axis'
tzsource%ngrid = 2

WAUTELET Philippe
committed
tzsource%cunits = 'm s-1'
gcond = .true.

WAUTELET Philippe
committed
tzsource%cmnhname = 'INIF'
tzsource%clongname = 'initial state'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, 1, odonotinit = .true., ooverwrite = .true. )
gcond = .true.

WAUTELET Philippe
committed
tzsource%cmnhname = 'ENDF'
tzsource%clongname = 'final state'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, 1, odonotinit = .true., ooverwrite = .true. )
gcond = .true.

WAUTELET Philippe
committed
tzsource%cmnhname = 'AVEF'
tzsource%clongname = 'averaged state'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, 1, odonotinit = .true., ooverwrite = .false. )

WAUTELET Philippe
committed
tzsource%cunits = 'm s-2'
gcond = .true.

WAUTELET Philippe
committed
tzsource%cmnhname = 'ASSE'
tzsource%clongname = 'time filter (Asselin)'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, nasseu )
gcond = nmodel > 1

WAUTELET Philippe
committed
tzsource%cmnhname = 'NEST'
tzsource%clongname = 'nesting'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, nnestu )

WAUTELET Philippe
committed
gcond = lforcing

WAUTELET Philippe
committed
tzsource%cmnhname = 'FRC'
tzsource%clongname = 'forcing'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, nfrcu )

WAUTELET Philippe
committed
gcond = onudging

WAUTELET Philippe
committed
tzsource%cmnhname = 'NUD'
tzsource%clongname = 'nudging'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, nnudu )

WAUTELET Philippe
committed
gcond = .not.l1d .and. .not.lcartesian

WAUTELET Philippe
committed
tzsource%cmnhname = 'CURV'
tzsource%clongname = 'curvature'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, ncurvu )

WAUTELET Philippe
committed
gcond = lcorio

WAUTELET Philippe
committed
tzsource%cmnhname = 'COR'
tzsource%clongname = 'Coriolis'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, ncoru )

WAUTELET Philippe
committed
gcond = onumdifu

WAUTELET Philippe
committed
tzsource%cmnhname = 'DIF'
tzsource%clongname = 'numerical diffusion'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, ndifu )

WAUTELET Philippe
committed
gcond = ohorelax_uvwth .or. ove_relax .or. ove_relax_grd

WAUTELET Philippe
committed
tzsource%cmnhname = 'REL'
tzsource%clongname = 'relaxation'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, nrelu )

WAUTELET Philippe
committed
gcond = odragtree

WAUTELET Philippe
committed
tzsource%cmnhname = 'DRAG'
tzsource%clongname = 'drag force'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, ndragu )

WAUTELET Philippe
committed
gcond = ldragbldg
tzsource%cmnhname = 'DRAGB'
tzsource%clongname = 'drag force due to buildings'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, ndragbu )
gcond = hturb == 'TKEL'

WAUTELET Philippe
committed
tzsource%cmnhname = 'VTURB'
tzsource%clongname = 'vertical turbulent diffusion'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, nvturbu )

WAUTELET Philippe
committed
gcond = hturb == 'TKEL' .and. HTURBDIM == '3DIM'

WAUTELET Philippe
committed
tzsource%cmnhname = 'HTURB'
tzsource%clongname = 'horizontal turbulent diffusion'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, nhturbu )

WAUTELET Philippe
committed
gcond = hsconv == 'EDKF'

WAUTELET Philippe
committed
tzsource%cmnhname = 'MAFL'
tzsource%clongname = 'mass flux'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, nmaflu )

WAUTELET Philippe
committed
gcond = lvisc .and. lvisc_uvw

WAUTELET Philippe
committed
tzsource%cmnhname = 'VISC'
tzsource%clongname = 'viscosity'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, nviscu )

WAUTELET Philippe
committed
gcond = .true.

WAUTELET Philippe
committed
tzsource%cmnhname = 'ADV'
tzsource%clongname = 'advection'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, nadvu )

WAUTELET Philippe
committed
gcond = .true.

WAUTELET Philippe
committed
tzsource%cmnhname = 'PRES'
tzsource%clongname = 'pressure'
call Budget_source_add( tbudgets(NBUDGET_U), tzsource, gcond, npresu )

WAUTELET Philippe
committed
end if
! Budget of RV
tbudgets(NBUDGET_V)%lenabled = lbu_rv
if ( lbu_rv ) then
allocate( tbudgets(NBUDGET_V)%trhodj )
tbudgets(NBUDGET_V)%trhodj%cmnhname = 'RhodJY'
tbudgets(NBUDGET_V)%trhodj%cstdname = ''
tbudgets(NBUDGET_V)%trhodj%clongname = 'RhodJY'
tbudgets(NBUDGET_V)%trhodj%cunits = 'kg'
tbudgets(NBUDGET_V)%trhodj%ccomment = 'RhodJ for momentum along Y axis'
tbudgets(NBUDGET_V)%trhodj%ngrid = 3
tbudgets(NBUDGET_V)%trhodj%ntype = TYPEREAL
tbudgets(NBUDGET_V)%trhodj%ndims = 3
allocate( tbudgets(NBUDGET_V)%trhodj%xdata(ibudim1, ibudim2, ibudim3) )
tbudgets(NBUDGET_V)%trhodj%xdata(:, :, :) = 0.
!Allocate all basic source terms (used or not)
!The size should be large enough (bigger than necessary is OK)
isourcesmax = 19
tbudgets(NBUDGET_V)%nsourcesmax = isourcesmax
allocate( tbudgets(NBUDGET_V)%tsources(isourcesmax) )
allocate( tbudgets(NBUDGET_V)%xtmpstore(ibudim1, ibudim2, ibudim3) )
tbudgets(NBUDGET_V)%tsources(:)%ngroup = 0
tzsource%ccomment = 'Budget of momentum along Y axis'
tzsource%ngrid = 3
tzsource%cunits = 'm s-1'
gcond = .true.
tzsource%cmnhname = 'INIF'
tzsource%clongname = 'initial state'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, 1, odonotinit = .true., ooverwrite = .true. )
gcond = .true.
tzsource%cmnhname = 'ENDF'
tzsource%clongname = 'final state'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, 1, odonotinit = .true., ooverwrite = .true. )
gcond = .true.
tzsource%cmnhname = 'AVEF'
tzsource%clongname = 'averaged state'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, 1, odonotinit = .true., ooverwrite = .false. )
tzsource%cunits = 'm s-2'
gcond = .true.
tzsource%cmnhname = 'ASSE'
tzsource%clongname = 'time filter (Asselin)'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, nassev )
gcond = nmodel > 1
tzsource%cmnhname = 'NEST'
tzsource%clongname = 'nesting'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, nnestv )
gcond = lforcing
tzsource%cmnhname = 'FRC'
tzsource%clongname = 'forcing'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, nfrcv )
gcond = onudging
tzsource%cmnhname = 'NUD'
tzsource%clongname = 'nudging'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, nnudv )
gcond = .not.l1d .and. .not.lcartesian
tzsource%cmnhname = 'CURV'
tzsource%clongname = 'curvature'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, ncurvv )
gcond = lcorio
tzsource%cmnhname = 'COR'
tzsource%clongname = 'Coriolis'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, ncorv )
gcond = onumdifu
tzsource%cmnhname = 'DIF'
tzsource%clongname = 'numerical diffusion'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, ndifv )
gcond = ohorelax_uvwth .or. ove_relax .or. ove_relax_grd
tzsource%cmnhname = 'REL'
tzsource%clongname = 'relaxation'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, nrelv )
gcond = odragtree
tzsource%cmnhname = 'DRAG'
tzsource%clongname = 'drag force'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, ndragv )
gcond = ldragbldg
tzsource%cmnhname = 'DRAGB'
tzsource%clongname = 'drag force due to buildings'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, ndragbv )
gcond = hturb == 'TKEL'
tzsource%cmnhname = 'VTURB'
tzsource%clongname = 'vertical turbulent diffusion'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, nvturbv )
gcond = hturb == 'TKEL' .and. HTURBDIM == '3DIM'
tzsource%cmnhname = 'HTURB'
tzsource%clongname = 'horizontal turbulent diffusion'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, nhturbv )
gcond = hsconv == 'EDKF'
tzsource%cmnhname = 'MAFL'
tzsource%clongname = 'mass flux'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, nmaflv )
gcond = lvisc .and. lvisc_uvw
tzsource%cmnhname = 'VISC'
tzsource%clongname = 'viscosity'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, nviscv )
gcond = .true.
tzsource%cmnhname = 'ADV'
tzsource%clongname = 'advection'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, nadvv )
gcond = .true.
tzsource%cmnhname = 'PRES'
tzsource%clongname = 'pressure'
call Budget_source_add( tbudgets(NBUDGET_V), tzsource, gcond, npresv )
end if
! Budget of RW
tbudgets(NBUDGET_W)%lenabled = lbu_rw
if ( lbu_rw ) then
allocate( tbudgets(NBUDGET_W)%trhodj )
tbudgets(NBUDGET_W)%trhodj%cmnhname = 'RhodJZ'
tbudgets(NBUDGET_W)%trhodj%cstdname = ''
tbudgets(NBUDGET_W)%trhodj%clongname = 'RhodJZ'
tbudgets(NBUDGET_W)%trhodj%cunits = 'kg'
tbudgets(NBUDGET_W)%trhodj%ccomment = 'RhodJ for momentum along Y axis'
tbudgets(NBUDGET_W)%trhodj%ngrid = 4
tbudgets(NBUDGET_W)%trhodj%ntype = TYPEREAL
tbudgets(NBUDGET_W)%trhodj%ndims = 3
allocate( tbudgets(NBUDGET_W)%trhodj%xdata(ibudim1, ibudim2, ibudim3) )
tbudgets(NBUDGET_W)%trhodj%xdata(:, :, :) = 0.
!Allocate all basic source terms (used or not)
!The size should be large enough (bigger than necessary is OK)
isourcesmax = 17
tbudgets(NBUDGET_W)%nsourcesmax = isourcesmax
allocate( tbudgets(NBUDGET_W)%tsources(isourcesmax) )
allocate( tbudgets(NBUDGET_W)%xtmpstore(ibudim1, ibudim2, ibudim3) )
tbudgets(NBUDGET_W)%tsources(:)%ngroup = 0
tzsource%ccomment = 'Budget of momentum along Z axis'
tzsource%ngrid = 4
tzsource%cunits = 'm s-1'
gcond = .true.
tzsource%cmnhname = 'INIF'
tzsource%clongname = 'initial state'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, 1, odonotinit = .true., ooverwrite = .true. )
gcond = .true.
tzsource%cmnhname = 'ENDF'
tzsource%clongname = 'final state'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, 1, odonotinit = .true., ooverwrite = .true. )
gcond = .true.
tzsource%cmnhname = 'AVEF'
tzsource%clongname = 'averaged state'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, 1, odonotinit = .true., ooverwrite = .false. )
tzsource%cunits = 'm s-2'
gcond = .true.
tzsource%cmnhname = 'ASSE'
tzsource%clongname = 'time filter (Asselin)'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, nassew )
gcond = nmodel > 1
tzsource%cmnhname = 'NEST'
tzsource%clongname = 'nesting'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, nnestw )
gcond = lforcing
tzsource%cmnhname = 'FRC'
tzsource%clongname = 'forcing'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, nfrcw )
gcond = onudging
tzsource%cmnhname = 'NUD'
tzsource%clongname = 'nudging'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, nnudw )
gcond = .not.l1d .and. .not.lcartesian .and. .not.lthinshell
tzsource%cmnhname = 'CURV'
tzsource%clongname = 'curvature'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, ncurvw )
gcond = lcorio .and. .not.l1d .and. .not.lthinshell
tzsource%cmnhname = 'COR'
tzsource%clongname = 'Coriolis'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, ncorw )
gcond = onumdifu
tzsource%cmnhname = 'DIF'
tzsource%clongname = 'numerical diffusion'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, ndifw )
gcond = ohorelax_uvwth .or. ove_relax .or. ove_relax_grd
tzsource%cmnhname = 'REL'
tzsource%clongname = 'relaxation'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, nrelw )
gcond = hturb == 'TKEL'
tzsource%cmnhname = 'VTURB'
tzsource%clongname = 'vertical turbulent diffusion'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, nvturbw )
gcond = hturb == 'TKEL' .and. HTURBDIM == '3DIM'
tzsource%cmnhname = 'HTURB'
tzsource%clongname = 'horizontal turbulent diffusion'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, nhturbw )
gcond = lvisc .and. lvisc_uvw
tzsource%cmnhname = 'VISC'
tzsource%clongname = 'viscosity'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, nviscw )
gcond = .true.
tzsource%cmnhname = 'GRAV'
tzsource%clongname = 'gravity'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, ngravw )
gcond = .true.
tzsource%cmnhname = 'ADV'
tzsource%clongname = 'advection'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, nadvw )
gcond = .true.
tzsource%cmnhname = 'PRES'
tzsource%clongname = 'pressure'
call Budget_source_add( tbudgets(NBUDGET_W), tzsource, gcond, npresw )
end if
! Budget of RTH
tbudgets(NBUDGET_TH)%lenabled = lbu_rth
if ( lbu_rth ) then
tbudgets(NBUDGET_TH)%trhodj => tburhodj
!Allocate all basic source terms (used or not)
!The size should be large enough (bigger than necessary is OK)
isourcesmax = 53
tbudgets(NBUDGET_TH)%nsourcesmax = isourcesmax
allocate( tbudgets(NBUDGET_TH)%tsources(isourcesmax) )
allocate( tbudgets(NBUDGET_TH)%xtmpstore(ibudim1, ibudim2, ibudim3) )
tbudgets(NBUDGET_TH)%tsources(:)%ngroup = 0
tzsource%ccomment = 'Budget of potential temperature'
tzsource%ngrid = 1
tzsource%cunits = 'K'
gcond = .true.
tzsource%cmnhname = 'INIF'
tzsource%clongname = 'initial state'
call Budget_source_add( tbudgets(NBUDGET_TH), tzsource, gcond, 1, odonotinit = .true., ooverwrite = .true. )
gcond = .true.
tzsource%cmnhname = 'ENDF'
tzsource%clongname = 'final state'
call Budget_source_add( tbudgets(NBUDGET_TH), tzsource, gcond, 1, odonotinit = .true., ooverwrite = .true. )
gcond = .true.
tzsource%cmnhname = 'AVEF'
tzsource%clongname = 'averaged state'
call Budget_source_add( tbudgets(NBUDGET_TH), tzsource, gcond, 1, odonotinit = .true., ooverwrite = .false. )
tzsource%cunits = 'K s-1'
gcond = .true.
tzsource%cmnhname = 'ASSE'
tzsource%clongname = 'time filter (Asselin)'
call Budget_source_add( tbudgets(NBUDGET_TH), tzsource, gcond, nasseth )
gcond = nmodel > 1
tzsource%cmnhname = 'NEST'
tzsource%clongname = 'nesting'
call Budget_source_add( tbudgets(NBUDGET_TH), tzsource, gcond, nnestth )
gcond = lforcing
tzsource%cmnhname = 'FRC'
tzsource%clongname = 'forcing'
call Budget_source_add( tbudgets(NBUDGET_TH), tzsource, gcond, nfrcth )
gcond = l2d_adv_frc
tzsource%cmnhname = '2DADV'
tzsource%clongname = 'advective forcing'
call Budget_source_add( tbudgets(NBUDGET_TH), tzsource, gcond, n2dadvth )
gcond = l2d_rel_frc
tzsource%cmnhname = '2DREL'
tzsource%clongname = 'relaxation forcing'
call Budget_source_add( tbudgets(NBUDGET_TH), tzsource, gcond, n2drelth )
gcond = onudging
tzsource%cmnhname = 'NUD'
tzsource%clongname = 'nudging'
call Budget_source_add( tbudgets(NBUDGET_TH), tzsource, gcond, nnudth )
gcond = krr > 0 .and. .not.l1d
tzsource%cmnhname = 'PREF'
tzsource%clongname = 'reference pressure'
call Budget_source_add( tbudgets(NBUDGET_TH), tzsource, gcond, nprefth )
gcond = onumdifth
tzsource%cmnhname = 'DIF'
tzsource%clongname = 'numerical diffusion'
call Budget_source_add( tbudgets(NBUDGET_TH), tzsource, gcond, ndifth )
gcond = ohorelax_uvwth .or. ove_relax .or. ove_relax_grd
tzsource%cmnhname = 'REL'
tzsource%clongname = 'relaxation'
call Budget_source_add( tbudgets(NBUDGET_TH), tzsource, gcond, nrelth )
gcond = hrad /= 'NONE'
tzsource%cmnhname = 'RAD'
tzsource%clongname = 'radiation'
call Budget_source_add( tbudgets(NBUDGET_TH), tzsource, gcond, nradth )
gcond = hdconv == 'KAFR' .OR. hsconv == 'KAFR'
tzsource%cmnhname = 'DCONV'
tzsource%clongname = 'KAFR convection'
call Budget_source_add( tbudgets(NBUDGET_TH), tzsource, gcond, ndconvth )
gcond = hturb == 'TKEL'
tzsource%cmnhname = 'VTURB'
tzsource%clongname = 'vertical turbulent diffusion'
call Budget_source_add( tbudgets(NBUDGET_TH), tzsource, gcond, nvturbth )
gcond = hturb == 'TKEL' .and. HTURBDIM == '3DIM'
tzsource%cmnhname = 'HTURB'