67 SUBROUTINE ana_sediment_tile (ng, tile, model, &
68 & LBi, UBi, LBj, UBj, &
69 & IminS, ImaxS, JminS, JmaxS, &
72#if defined BBL_MODEL && (defined MB_BBL || defined SSW_BBL)
77 & bed, bed_frac, bed_mass, &
89 integer,
intent(in) :: ng, tile, model
90 integer,
intent(in) :: LBi, UBi, LBj, UBj
91 integer,
intent(in) :: IminS, ImaxS, JminS, JmaxS
94 real(r8),
intent(in) :: pm(LBi:,LBj:)
95 real(r8),
intent(in) :: pn(LBi:,LBj:)
96 real(r8),
intent(in) :: xr(LBi:,LBj:)
97 real(r8),
intent(in) :: yr(LBi:,LBj:)
98# if defined BBL_MODEL && (defined MB_BBL || defined SSW_BBL)
99 real(r8),
intent(in) :: rho(LBi:,LBj:,:)
102 real(r8),
intent(inout) :: t(LBi:,LBj:,:,:,:)
103 real(r8),
intent(out) :: bed(LBi:,LBj:,:,:)
104 real(r8),
intent(out) :: bed_frac(LBi:,LBj:,:,:)
105 real(r8),
intent(out) :: bed_mass(LBi:,LBj:,:,:,:)
107 real(r8),
intent(inout) :: bottom(LBi:,LBj:,:)
109 real(r8),
intent(in) :: pm(LBi:UBi,LBj:UBj)
110 real(r8),
intent(in) :: pn(LBi:UBi,LBj:UBj)
111 real(r8),
intent(in) :: xr(LBi:UBi,LBj:UBj)
112 real(r8),
intent(in) :: yr(LBi:UBi,LBj:UBj)
113# if defined BBL_MODEL && (defined MB_BBL || defined SSW_BBL)
114 real(r8),
intent(in) :: rho(LBi:,LBj:,:)
117 real(r8),
intent(inout) :: t(LBi:UBi,LBj:UBj,N(ng),3,NT(ng))
118 real(r8),
intent(out) :: bed(LBi:UBi,LBj:UBj,Nbed,MBEDP)
119 real(r8),
intent(out) :: bed_frac(LBi:UBi,LBj:UBj,Nbed,NST)
120 real(r8),
intent(out) :: bed_mass(LBi:UBi,LBj:UBj,Nbed,2,NST)
122 real(r8),
intent(inout) :: bottom(LBi:UBi,LBj:UBj,MBOTP)
128 integer :: Tstr, Tend
130 integer :: i, ised, j, k
132 real(r8) :: cff1, cff2, cff3, cff4, Kvisc, phinot
134#include "set_bounds.h"
136#if defined BBL_MODEL && !defined SEDIMENT
143# if defined BL_TEST || defined NJ_BIGHT
146 bottom(i,j,
isd50)=0.0005_r8
147 bottom(i,j,
idens)=2650.0_r8
150# elif defined LAKE_SIGNELL || defined ADRIA02
153 bottom(i,j,
isd50)=0.000150_r8
154 bottom(i,j,
idens)=2650.0_r8
157# elif defined SED_TOY
160 bottom(i,j,
isd50)=0.0005_r8
161 bottom(i,j,
idens)=2650.0_r8
165 ana_sediment.h: no values provided for bottom(:,:,
isd50) and
169# if defined MB_BBL || defined SSW_BBL
185 rhowater=rho(i,j,1)+1000.0_r8
186 cff=sqrt((bottom(i,j,
idens)-rhowater)* &
188 & bottom(i,j,
isd50)/rhowater)/kvisc
193 IF (cff.lt.100.0_r8)
THEN
194 theta_cb=0.041_r8*(log(cff)**2)-0.356_r8*log(cff)-0.977_r8
196 ELSE IF (cff.gt.3000.0_r8)
THEN
199 theta_cb=0.132_r8*log(cff)-1.804_r8
222 bottom(i,j,
iwsed)=0.02_r8
257# if defined LAKE_SIGNELL || defined ADRIA02
265 bed(i,j,k,
ithck)=0.10_r8
266 bed(i,j,k,
iporo)=0.90_r8
268 bed_frac(i,j,k,ised)=1.0_r8/real(nst,r8)
274 bottom(i,j,
irlen)=0.10_r8
275 bottom(i,j,
irhgt)=0.01_r8
279# elif defined ESTUARY_TEST
287 bed(i,j,k,
ithck)=0.001_r8
288 bed(i,j,k,
iporo)=0.90_r8
290 bed_frac(i,j,k,ised)=1.0_r8/real(nst,r8)
296 bottom(i,j,
irlen)=0.10_r8
297 bottom(i,j,
irhgt)=0.01_r8
301# elif defined INLET_TEST
309 bed(i,j,k,
ithck)=10.0_r8
310 bed(i,j,k,
iporo)=0.50_r8
312 bed_frac(i,j,k,ised)=1.0_r8/real(nst,r8)
318 bottom(i,j,
irlen)=0.10_r8
319 bottom(i,j,
irhgt)=0.01_r8
323# elif defined SED_TOY
331 bed(i,j,k,
ithck)=0.01_r8
332 bed(i,j,k,
iporo)=0.30_r8
336 bed_frac(i,j,k,1)=1.0_r8
337 bed_frac(i,j,k,2)=0.0_r8
342 bottom(i,j,
irlen)=0.10_r8
343 bottom(i,j,
irhgt)=0.01_r8
351# elif defined SED_TEST1
359 bed(i,j,k,
ithck)=15.00_r8
360 bed(i,j,k,
iporo)=0.50_r8
362 bed_frac(i,j,k,ised)=1.0_r8/real(nst,r8)
368 bottom(i,j,
irlen)=0.10_r8
369 bottom(i,j,
irhgt)=0.01_r8
373# elif defined SHOREFACE
381 bed(i,j,k,
ithck)=5.0_r8
382 bed(i,j,k,
iporo)=0.50_r8
384 bed_frac(i,j,k,ised)=1.0_r8/real(nst,r8)
390 bottom(i,j,
irlen)=0.10_r8
391 bottom(i,j,
irhgt)=0.01_r8
395# elif defined TEST_CHAN
403 bed(i,j,k,
ithck)=1.0_r8
404 bed(i,j,k,
iporo)=0.90_r8
406 bed_frac(i,j,k,ised)=1.0_r8/real(nst,r8)
412 bottom(i,j,
irlen)=0.0_r8
413 bottom(i,j,
irhgt)=0.0_r8
418 ana_sediment.h: no values provided for bed, bed_mass, bottom.
434 bed_mass(i,j,k,1,ised)=bed(i,j,k,
ithck)* &
436 & (1.0_r8-bed(i,j,k,
iporo))* &
437 & bed_frac(i,j,k,ised)
452 cff1=cff1*
sd50(ised,ng)**bed_frac(i,j,1,ised)
453 cff2=cff2*
srho(ised,ng)**bed_frac(i,j,1,ised)
454 cff3=cff3*
wsed(ised,ng)**bed_frac(i,j,1,ised)
455 cff4=cff4*
tau_ce(ised,ng)**bed_frac(i,j,1,ised)
457 bottom(i,j,
isd50)=cff1
458 bottom(i,j,
idens)=cff2
459 bottom(i,j,
iwsed)=cff3
460 bottom(i,j,
itauc)=cff4
462 bottom(i,j,
idoff)=0.0_r8
463 bottom(i,j,
idslp)=0.0_r8
464 bottom(i,j,
idtim)=0.0_r8
465 bottom(i,j,
idbmx)=0.0_r8
466 bottom(i,j,
idbmm)=0.0_r8
467 bottom(i,j,
idbzs)=0.0_r8
468 bottom(i,j,
idbzm)=0.0_r8
469 bottom(i,j,
idbzp)=0.0_r8
subroutine ana_sediment_tile(ng, tile, model, lbi, ubi, lbj, ubj, imins, imaxs, jmins, jmaxs, pm, pn, xr, yr, rho, t, bed, bed_frac, bed_mass, bottom)