34 SUBROUTINE ice_enthalpy (ng, tile, model)
41 integer,
intent(in) :: ng, tile, model
45 character (len=*),
parameter :: MyFile = &
51 CALL wclock_on (ng, model, 42, __line__, myfile)
53 CALL ice_enthalpy_tile (ng, tile, model, &
54 & lbi, ubi, lbj, ubj, &
55 & imins, imaxs, jmins, jmaxs, &
56 & liold(ng), linew(ng), &
59 CALL wclock_off (ng, model, 42, __line__, myfile)
63 END SUBROUTINE ice_enthalpy
66 SUBROUTINE ice_enthalpy_tile (ng, tile, model, &
67 & LBi, UBi, LBj, UBj, &
68 & IminS, ImaxS, JminS, JmaxS, &
75 integer,
intent(in) :: ng, tile, model
76 integer,
intent(in) :: LBi, UBi, LBj, UBj
77 integer,
intent(in) :: IminS, ImaxS, JminS, JmaxS
78 integer,
intent(in) :: liold, linew
81 real(r8),
intent(inout) :: Si(LBi:,LBj:,:,:)
83 real(r8),
intent(inout) :: Si(LBi:UBi,LBj:UBj,2,nIceS)
90#include "set_bounds.h"
103 si(i,j,liold,
isenth)=0.0_r8
112 & lbi, ubi, lbj, ubj, &
116 & lbi, ubi, lbj, ubj, &
123 & lbi, ubi, lbj, ubj, &
130 END SUBROUTINE ice_enthalpy_tile
subroutine exchange_r2d_tile(ng, tile, lbi, ubi, lbj, ubj, a)
real(r8), dimension(:), allocatable min_hi
integer, parameter isenth
type(t_ice), dimension(:), allocatable ice
integer, parameter istice
integer, parameter ishice
logical, dimension(:), allocatable ewperiodic
logical, dimension(:), allocatable nsperiodic
subroutine mp_exchange2d(ng, tile, model, nvar, lbi, ubi, lbj, ubj, nghost, ew_periodic, ns_periodic, a, b, c, d)
recursive subroutine wclock_off(ng, model, region, line, routine)
recursive subroutine wclock_on(ng, model, region, line, routine)