2 SUBROUTINE ana_tair (ng, tile, model)
22 integer,
intent(in) :: ng, tile, model
26 character (len=*),
parameter :: MyFile = &
31 CALL ana_tair_tile (ng, tile, model, &
32 & lbi, ubi, lbj, ubj, &
33 & imins, imaxs, jmins, jmaxs, &
47 END SUBROUTINE ana_tair
50 SUBROUTINE ana_tair_tile (ng, tile, model, &
51 & LBi, UBi, LBj, UBj, &
52 & IminS, ImaxS, JminS, JmaxS, &
66 integer,
intent(in) :: ng, tile, model
67 integer,
intent(in) :: LBi, UBi, LBj, UBj
68 integer,
intent(in) :: IminS, ImaxS, JminS, JmaxS
71 real(r8),
intent(out) :: Tair(LBi:,LBj:)
73 real(r8),
intent(out) :: Tair(LBi:UBi,LBj:UBj)
80#include "set_bounds.h"
99 ana_tair.h: no values provided for tair.
106 & lbi, ubi, lbj, ubj, &
112 & lbi, ubi, lbj, ubj, &
119 END SUBROUTINE ana_tair_tile
subroutine ana_tair_tile(ng, tile, model, lbi, ubi, lbj, ubj, imins, imaxs, jmins, jmaxs, tair)
subroutine ana_tair(ng, tile, model)
subroutine exchange_r2d_tile(ng, tile, lbi, ubi, lbj, ubj, a)
type(t_forces), dimension(:), allocatable forces
character(len=256), dimension(39) ananame
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)