2 SUBROUTINE ana_cloud (ng, tile, model)
21 integer,
intent(in) :: ng, tile, model
25 character (len=*),
parameter :: MyFile = &
30 CALL ana_cloud_tile (ng, tile, model, &
31 & lbi, ubi, lbj, ubj, &
32 & imins, imaxs, jmins, jmaxs, &
46 END SUBROUTINE ana_cloud
49 SUBROUTINE ana_cloud_tile (ng, tile, model, &
50 & LBi, UBi, LBj, UBj, &
51 & IminS, ImaxS, JminS, JmaxS, &
68 integer,
intent(in) :: ng, tile, model
69 integer,
intent(in) :: LBi, UBi, LBj, UBj
70 integer,
intent(in) :: IminS, ImaxS, JminS, JmaxS
73 real(r8),
intent(out) :: cloud(LBi:,LBj:)
75 real(r8),
intent(out) :: cloud(LBi:UBi,LBj:UBj)
87 real(dp),
dimension(14) :: Coktas = &
88 & (/ 6.29_r8, 6.26_r8, 6.31_r8, 6.31_r8, 6.32_r8, &
89 & 6.70_r8, 7.12_r8, 7.26_r8, 6.93_r8, 6.25_r8, &
90 & 6.19_r8, 6.23_r8, 6.31_r8, 6.29_r8 /)
92 real(dp),
dimension(14) :: Cyday = &
93 & (/ 0.0_dp, 16.0_dp, 46.0_dp, 75.0_dp, 105.0_dp, &
94 & 136.0_dp, 166.0_dp, 197.0_dp, 228.0_dp, 258.0_dp, &
95 & 289.0_dp, 319.0_dp, 350.0_dp, 365.0_dp /)
98#include "set_bounds.h"
110 IF ((yday.ge.cyday(i)).and.(yday.le.cyday(i+1)))
THEN
111 cval=0.125_r8*(coktas(i )*(cyday(i+1)-yday)+ &
112 & coktas(i+1)*(yday-cyday(i)))/ &
113 & (cyday(i+1)-cyday(i))
116#elif defined BENCHMARK
118#elif defined NJ_BIGHT
134 & lbi, ubi, lbj, ubj, &
140 & lbi, ubi, lbj, ubj, &
147 END SUBROUTINE ana_cloud_tile
subroutine ana_cloud_tile(ng, tile, model, lbi, ubi, lbj, ubj, imins, imaxs, jmins, jmaxs, cloud)
subroutine ana_cloud(ng, tile, model)
subroutine, public caldate(currenttime, yy_i, yd_i, mm_i, dd_i, h_i, m_i, s_i, yd_dp, dd_dp, h_dp, m_dp, s_dp)
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
real(dp), dimension(:), allocatable tdays
subroutine mp_exchange2d(ng, tile, model, nvar, lbi, ubi, lbj, ubj, nghost, ew_periodic, ns_periodic, a, b, c, d)