2 SUBROUTINE ana_m2clima (ng, tile, model)
20 integer,
intent(in) :: ng, tile, model
24 character (len=*),
parameter :: MyFile = &
29 CALL ana_m2clima_tile (ng, tile, model, &
30 & lbi, ubi, lbj, ubj, &
31 & imins, imaxs, jmins, jmaxs)
44 END SUBROUTINE ana_m2clima
47 SUBROUTINE ana_m2clima_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"
80 clima(ng)%ubarclm(i,j)=???
85 clima(ng)%vbarclm(i,j)=???
93 & lbi, ubi, lbj, ubj, &
94 &
clima(ng) % ubarclm)
96 & lbi, ubi, lbj, ubj, &
97 &
clima(ng) % vbarclm)
102 & lbi, ubi, lbj, ubj, &
105 &
clima(ng) % ubarclm, &
106 % CLIMA(ng) % vbarclm)
111 END SUBROUTINE ana_m2clima_tile
subroutine ana_m2clima_tile(ng, tile, model, lbi, ubi, lbj, ubj, imins, imaxs, jmins, jmaxs)
subroutine ana_m2clima(ng, tile, model)
subroutine exchange_u2d_tile(ng, tile, lbi, ubi, lbj, ubj, a)
subroutine exchange_v2d_tile(ng, tile, lbi, ubi, lbj, ubj, a)
type(t_clima), dimension(:), allocatable clima
character(len=256), dimension(39) ananame
logical, dimension(:), allocatable ewperiodic
logical, dimension(:), allocatable nsperiodic
logical, dimension(:), allocatable lm2clm
subroutine mp_exchange2d(ng, tile, model, nvar, lbi, ubi, lbj, ubj, nghost, ew_periodic, ns_periodic, a, b, c, d)