2 SUBROUTINE ana_dqdsst (ng, tile, model)
28 integer,
intent(in) :: ng, tile, model
32 character (len=*),
parameter :: MyFile = &
37 CALL ana_dqdsst_tile (ng, tile, model, &
38 & lbi, ubi, lbj, ubj, &
39 & imins, imaxs, jmins, jmaxs, &
54 END SUBROUTINE ana_dqdsst
57 SUBROUTINE ana_dqdsst_tile (ng, tile, model, &
58 & LBi, UBi, LBj, UBj, &
59 & IminS, ImaxS, JminS, JmaxS, &
74 integer,
intent(in) :: ng, tile, model
75 integer,
intent(in) :: LBi, UBi, LBj, UBj
76 integer,
intent(in) :: IminS, ImaxS, JminS, JmaxS
79 real(r8),
intent(in) :: Hz(LBi:,LBj:,:)
80 real(r8),
intent(out) :: dqdt(LBi:,LBj:)
82 real(r8),
intent(in) :: Hz(LBi:UBi,LBj:UBj,1:N(ng))
83 real(r8),
intent(out) :: dqdt(LBi:UBi,LBj:UBj)
92#include "set_bounds.h"
102 dqdt(i,j)=fac*hz(i,j,n(ng))
117 & lbi, ubi, lbj, ubj, &
123 & lbi, ubi, lbj, ubj, &
130 END SUBROUTINE ana_dqdsst_tile
subroutine ana_dqdsst(ng, tile, model)
subroutine ana_dqdsst_tile(ng, tile, model, lbi, ubi, lbj, ubj, imins, imaxs, jmins, jmaxs, hz, dqdt)
subroutine exchange_r2d_tile(ng, tile, lbi, ubi, lbj, ubj, a)
type(t_forces), dimension(:), allocatable forces
type(t_grid), dimension(:), allocatable grid
character(len=256), dimension(39) ananame
real(dp), parameter day2sec
logical, dimension(:), allocatable ewperiodic
logical, dimension(:), allocatable nsperiodic
subroutine mp_exchange2d(ng, tile, model, nvar, lbi, ubi, lbj, ubj, nghost, ew_periodic, ns_periodic, a, b, c, d)