53 INTEGER I,K,ITMP1,ITMP2,ITMP3,KI
54 REAL(SP),
DIMENSION(0:NT,KB) :: C,A,VHU,VHPU,VHV,VHPV
76 IF(itmp1 == 2 .OR. itmp2 == 2 .OR. itmp3 == 2)
THEN 81 vhu(i,1) = a(i,1) / (a(i,1)-1.)
82 vhv(i,1) = a(i,1) / (a(i,1)-1.)
91 vhpu(i,k) = 1.0_sp / (a(i,k)+c(i,k)*(1.-vhu(i,k-1))-1.)
92 vhpv(i,k) = 1.0_sp / (a(i,k)+c(i,k)*(1.-vhv(i,k-1))-1.)
93 vhu(i,k) = a(i,k) * vhpu(i,k)
94 vhv(i,k) = a(i,k) * vhpv(i,k)
95 vhpu(i,k) = (c(i,k)*vhpu(i,k-1)-
uf(i,k))*vhpu(i,k)
96 vhpv(i,k) = (c(i,k)*vhpv(i,k-1)-
vf(i,k))*vhpv(i,k)
115 uf(i,ki) = (vhu(i,ki)*
uf(i,ki+1)+vhpu(i,ki))
116 vf(i,ki) = (vhv(i,ki)*
vf(i,ki+1)+vhpv(i,ki))
real(sp), dimension(:), allocatable, target d1
real(sp), dimension(:,:), allocatable, target v
logical function dbg_set(vrb)
real(sp), dimension(:,:), allocatable, target dzz1
real(sp), dimension(:,:), allocatable, target vf
real(sp), dimension(:,:), allocatable, target u
real(sp), dimension(:), allocatable, target wubot
real(sp), dimension(:,:), allocatable, target uf
real(sp), dimension(:), allocatable, target wvbot
real(sp), dimension(:), allocatable, target wusurf
integer, dimension(:,:), allocatable, target nv
real(sp), dimension(:), allocatable, target tps
integer, dimension(:), allocatable iswetc
real(sp), dimension(:,:), allocatable, target dz1
real(sp), dimension(:), allocatable, target cc_sponge
real(sp), dimension(:), allocatable, target cbc
integer, parameter dbg_sbr
real(sp), dimension(:,:), allocatable, target km1
integer, dimension(:), allocatable, target isonb
real(sp), dimension(:), allocatable, target wvsurf