2 SUBROUTINE ana_m3clima (ng, tile, model)
20 integer,
intent(in) :: ng, tile, model
24 character (len=*),
parameter :: MyFile = &
29 CALL ana_m3clima_tile (ng, tile, model, &
30 & lbi, ubi, lbj, ubj, &
31 & imins, imaxs, jmins, jmaxs)
44 END SUBROUTINE ana_m3clima
47 SUBROUTINE ana_m3clima_tile (ng, tile, model, &
48 & LBi, UBi, LBj, UBj, &
49 & IminS, ImaxS, JminS, JmaxS)
63 integer,
intent(in) :: ng, tile, model
64 integer,
intent(in) :: LBi, UBi, LBj, UBj
65 integer,
intent(in) :: IminS, ImaxS, JminS, JmaxS
71#include "set_bounds.h"
81 clima(ng)%uclm(i,j,k)=???
86 clima(ng)%vclm(i,j,k)=???
95 & lbi, ubi, lbj, ubj, 1,
n(ng), &
98 & lbi, ubi, lbj, ubj, 1,
n(ng), &
104 & lbi, ubi, lbj, ubj, 1,
n(ng), &
107 &
clima(ng) % uclm, &
113 END SUBROUTINE ana_m3clima_tile
subroutine ana_m3clima(ng, tile, model)
subroutine ana_m3clima_tile(ng, tile, model, lbi, ubi, lbj, ubj, imins, imaxs, jmins, jmaxs)
subroutine exchange_u3d_tile(ng, tile, lbi, ubi, lbj, ubj, lbk, ubk, a)
subroutine exchange_v3d_tile(ng, tile, lbi, ubi, lbj, ubj, lbk, ubk, a)
type(t_clima), dimension(:), allocatable clima
character(len=256), dimension(39) ananame
integer, dimension(:), allocatable n
logical, dimension(:), allocatable ewperiodic
logical, dimension(:), allocatable nsperiodic
logical, dimension(:), allocatable lm3clm
subroutine mp_exchange3d(ng, tile, model, nvar, lbi, ubi, lbj, ubj, lbk, ubk, nghost, ew_periodic, ns_periodic, a, b, c, d)