2 SUBROUTINE ana_wtype (ng, tile, model)
47 integer,
intent(in) :: ng, tile, model
51 character (len=*),
parameter :: MyFile = &
56 CALL ana_wtype_tile (ng, tile, model, &
57 & lbi, ubi, lbj, ubj, &
58 & imins, imaxs, jmins, jmaxs, &
73 END SUBROUTINE ana_wtype
76 SUBROUTINE ana_wtype_tile (ng, tile, model, &
77 & LBi, UBi, LBj, UBj, &
78 & IminS, ImaxS, JminS, JmaxS, &
96 integer,
intent(in) :: ng, tile, model
97 integer,
intent(in) :: LBi, UBi, LBj, UBj
98 integer,
intent(in) :: IminS, ImaxS, JminS, JmaxS
101 real(r8),
intent(in) :: h(LBi:,LBj:)
102 real(r8),
intent(out) :: Jwtype(LBi:,LBj:)
104 real(r8),
intent(in) :: h(LBi:UBi,LBj:UBj)
105 real(r8),
intent(out) :: Jwtype(LBi:UBi,LBj:UBj)
110 logical,
save :: first = .true.
116 TYPE (T_STATS),
save :: Stats
118#include "set_bounds.h"
126 stats % checksum=0_i8b
143 jwtype(i,j)=anint(5.0_r8-4.5_r8*(tanh(h(i,j)*fac)))
157 & lbi, ubi, lbj, ubj, jwtype)
158 IF (
domain(ng)%NorthEast_Corner(tile))
THEN
159 WRITE (
stdout,10)
'Jerlov water type: wtype_grid', &
160 & ng, stats%min, stats%max
167 & lbi, ubi, lbj, ubj, &
173 & lbi, ubi, lbj, ubj, &
179 10
FORMAT (3x,
' ANA_WTYPE - ',a,/,19x, &
180 &
'(Grid = ',i2.2,
', Min = ',1p,e15.8,0p, &
181 &
' Max = ',1p,e15.8,0p,
')')
184 END SUBROUTINE ana_wtype_tile
subroutine ana_wtype_tile(ng, tile, model, lbi, ubi, lbj, ubj, imins, imaxs, jmins, jmaxs, h, jwtype)
subroutine ana_wtype(ng, tile, model)
subroutine exchange_r2d_tile(ng, tile, lbi, ubi, lbj, ubj, a)
type(t_grid), dimension(:), allocatable grid
type(t_mixing), dimension(:), allocatable mixing
character(len=256), dimension(39) ananame
type(t_domain), dimension(:), allocatable domain
integer, parameter r2dvar
logical, dimension(:), allocatable ewperiodic
logical, dimension(:), allocatable nsperiodic
real(dp), parameter large
subroutine mp_exchange2d(ng, tile, model, nvar, lbi, ubi, lbj, ubj, nghost, ew_periodic, ns_periodic, a, b, c, d)
subroutine, public stats_2dfld(ng, tile, model, gtype, s, extract_flag, lbi, ubi, lbj, ubj, f, fmask, debug)