50 REAL*8 :: gas_constmix
53 REAL*8 :: C_s = 1617.D0
69 REAL*8 :: initial_velocity
71 REAL*8 :: initial_density
75 REAL*8 :: solidvolumefraction
76 REAL*8 :: gasvolumefraction
77 REAL*8 :: final_solid_mass_flux
86 REAL*8 :: entrainment_rate
104 USE envi_module, ONLY: alpha ,p, c_vair, gas_constair
105 USE current_module, ONLY: u, r, h, t, solid_mass_flux, t0, tvent_flag , &
106 oned_model, initial_mf
107 USE particles_module, ONLY: rhosol, diam, iclass, fracsolid , v_s, s, c_d , &
108 sumsed ,solidmassflux_fract, acc_rate
122 pi = 4.d0 * atan(1.d0)
126 nmag_mix = nmag * ( 1.d0 - n ) / (1.d0 - nmag)
128 lambda = (n - nmag) / ( 1.d0 - nmag )
130 c_vmix = nmag_mix * cpwvapour + lambda * c_vair &
133 cv_magmix = nmag * cpwvapour + ( 1.d0 - nmag ) * c_s
135 nmag_gas = nmag_mix / n
137 gas_constmix = rwvapour * nmag_gas + gas_constair * ( 1.d0 - nmag_gas )
148 t = ( ( 1.d0 - lambda ) * cv_magmix * t0 + lambda * c_vair * t_a ) / &
149 ( ( 1.d0 - lambda )* cv_magmix + lambda * c_vair )
157 rhogas = p / ( gas_constmix * t )
158 rhosol_ave = 1/(sum(fracsolid/rhosol))
159 beta = 1.d0 / ( n / rhogas + ( 1.d0 - n ) / rhosol_ave)
161 initial_density = beta
164 u = sqrt((beta - alpha) * gi * h / (ri * beta))
168 epsilon = 0.075d0 / dsqrt( 1.0d0 + 718.0d0 * ri**2.4d0 )
170 IF ( oned_model )
THEN
180 solid_mass_flux = (beta * u * h * var) * ( 1.d0 - n )
181 initial_smf = (beta * u * h * var) * ( 1.d0 - n )
183 initial_mf = (beta * u * h * var) * 2 * pi
188 solidmassflux_fract(i) = solid_mass_flux*fracsolid(i)
192 v_s(i) = dsqrt( (rhosol(i) * gi * diam(i)) / (c_d(i) * beta) )
196 s(i) = 1.d0 / (h * u) * solidmassflux_fract(i) * v_s(i)
Current module This module contains descriptors for the initial conditions of the flow...
Mixture module This module contains all the variables required for describing and calculating the cha...
subroutine compute_mixture
Computing conditions within mixture This subroutine calculates the characteristics of the mixture by ...
Particles module This module contains the procedures and the variables related to the solid particles...
environment module This module contains all the variables related to the background environmental con...