36 REAL*8,
ALLOCATABLE,
DIMENSION(:) :: fracsolid
39 REAL*8,
ALLOCATABLE,
DIMENSION(:) :: init_fracsolid
42 REAL*8,
ALLOCATABLE,
DIMENSION(:) :: rhosol
45 REAL*8,
ALLOCATABLE,
DIMENSION(:) :: diam
48 REAL*8,
ALLOCATABLE,
DIMENSION(:) :: C_d
54 REAL*8,
ALLOCATABLE,
DIMENSION(:) :: sepsolid
57 REAL*8,
ALLOCATABLE,
DIMENSION(:) :: solidmassflux_fract
60 REAL*8,
ALLOCATABLE,
DIMENSION(:) :: v_s
63 REAL*8,
ALLOCATABLE,
DIMENSION(:) :: S
69 REAL*8 :: Total_Acc_rate
78 REAL*8 :: ustar !> shear velocity of flow
90 REAL*8 :: wavelengthfreen
93 REAL*8 :: wavelengthshearn
96 REAL*8 :: wavelengthfreex
99 REAL*8 :: wavelengthshearx
102 REAL*8 :: wavelength_height
105 REAL*8,
ALLOCATABLE,
DIMENSION(:) :: eta
108 REAL*8,
ALLOCATABLE,
DIMENSION(:) :: BV
111 REAL*8,
ALLOCATABLE,
DIMENSION(:) :: SS0
114 REAL*8,
ALLOCATABLE,
DIMENSION(:) :: norm_flux
117 REAL*8,
ALLOCATABLE,
DIMENSION(:) :: ipf
120 REAL*8,
ALLOCATABLE,
DIMENSION(:) :: fpf
124 INTEGER :: final = 9.D0
132 REAL*8,
ALLOCATABLE,
DIMENSION(:) :: phi_dist
133 REAL*8 :: left_tail_fract
134 REAL*8 :: right_tail_fract
154 delta_phi= (max_phi - min_phi) / no_bins
160 phi_dist(i) = phi_left + 0.5d0 * delta_phi
162 phi_right = min_phi + (i) * delta_phi
165 diam(i) = 1.d-3 * 2.0**(-phi_dist(i))
167 IF ( diam(i) .LE. diam1 )
THEN
171 ELSEIF ( diam(i) .LE. diam2 )
THEN
173 rhosol(i) = min_rho + ( diam(i) - diam1 ) / ( diam2 - diam1 ) * &
184 fracsolid(i) =
cdf(phi_right) -
cdf(phi_left)
190 left_tail_fract=
cdf(min_phi)
191 right_tail_fract= 1 -
cdf(max_phi)
193 If (left_tail_fract .GT. fracsolid(1))
THEN
195 fracsolid(1) = fracsolid(1) + left_tail_fract
199 If (right_tail_fract .GT. fracsolid(no_bins))
THEN
201 fracsolid(no_bins) = fracsolid(no_bins) + right_tail_fract
205 fracsolid(1:no_bins) = fracsolid(1:no_bins)/sum(fracsolid(1:no_bins))
223 REAL*8,
INTENT(IN) :: phi_in
225 cdf = 0.5d0 * (1.d0 + erf((phi_in - mean_phi)/(sigma_phi * sqrt(2.d0))))
238 ALLOCATE(solidmassflux_fract(iclass))
239 ALLOCATE(v_s(iclass))
241 ALLOCATE(diam(iclass))
242 ALLOCATE(rhosol(iclass))
243 ALLOCATE(fracsolid(iclass))
244 ALLOCATE(phi_dist(iclass))
245 ALLOCATE(c_d(iclass))
246 ALLOCATE(norm_flux(iclass))
247 ALLOCATE(ipf(iclass))
248 ALLOCATE(fpf(iclass))
subroutine initialize_particles
Allocating particles variables This subroutine allocates the variables defining the particle sediment...
subroutine allocate_particles
Particle inizialization This subroutine allocates the variables defining the particle physical charac...
real *8 function cdf(phi_in)
Defining cumulative density function of particle size.
Particles module This module contains the procedures and the variables related to the solid particles...