2 SUBROUTINE ana_respiration (ng, tile, model)
22 integer,
intent(in) :: ng, tile, model
26 character (len=*),
parameter :: MyFile = &
31 CALL ana_respiration_tile (ng, tile, model, &
32 & lbi, ubi, lbj, ubj, &
33 & imins, imaxs, jmins, jmaxs, &
34 &
ocean(ng) % respiration)
47 END SUBROUTINE ana_respiration
50 SUBROUTINE ana_respiration_tile (ng, tile, model, &
51 & LBi, UBi, LBj, UBj, &
52 & IminS, ImaxS, JminS, JmaxS, &
67 integer,
intent(in) :: ng, tile, model
68 integer,
intent(in) :: LBi, UBi, LBj, UBj
69 integer,
intent(in) :: IminS, ImaxS, JminS, JmaxS
72 real(r8),
intent(out) :: respiration(LBi:,LBj:,:)
74 real(r8),
intent(out) :: respiration(LBi:UBi,LBj:UBj,N(ng))
81#include "set_bounds.h"
87#if defined CHESAPEAKE_1TERM
92 IF (((i.ge.72).and.(j.le.35)).or. &
93 & (((i.ge.61).and.(i.le.71)).and. &
94 & ((j.ge. 6).and.(j.le.26))))
THEN
95 respiration(i,j,k)=0.0_r8
114 & lbi, ubi, lbj, ubj, 1, n(ng), &
120 & lbi, ubi, lbj, ubj, 1, n(ng), &
127 END SUBROUTINE ana_respiration_tile
subroutine ana_respiration_tile(ng, tile, model, lbi, ubi, lbj, ubj, imins, imaxs, jmins, jmaxs, respiration)
subroutine ana_respiration(ng, tile, model)
subroutine exchange_r3d_tile(ng, tile, lbi, ubi, lbj, ubj, lbk, ubk, a)
real(r8), dimension(:), allocatable resrate
character(len=256), dimension(39) ananame
type(t_ocean), dimension(:), allocatable ocean
logical, dimension(:), allocatable ewperiodic
logical, dimension(:), allocatable nsperiodic
subroutine mp_exchange3d(ng, tile, model, nvar, lbi, ubi, lbj, ubj, lbk, ubk, nghost, ew_periodic, ns_periodic, a, b, c, d)