SW_VAR_DENS_MODEL  0.9
Dept-averagedgas-particlemodel
parameters_2d.f90
Go to the documentation of this file.
1 !********************************************************************************
3 !
6 !********************************************************************************
8 
9  IMPLICIT NONE
10 
11  REAL*8 :: eps_newton
13 
14  REAL*8 :: dt0
15 
16  REAL*8 :: max_dt
17 
18  REAL*8 :: cfl
19 
20  REAL*8 :: eps_sing
21 
22  REAL*8 :: reconstr_coeff
23 
29 
35 
40  LOGICAL :: topography_demfile
41 
42 
47  LOGICAL :: energy_flag
48 
53  LOGICAL :: riemann_flag
54 
59  LOGICAL :: rheology_flag
60 
65  INTEGER :: rheology_model
66 
67  LOGICAL :: liquid_flag
68 
69  LOGICAL :: gas_flag
70 
71  LOGICAL :: topo_change_flag
72 
73  LOGICAL :: radial_source_flag
74 
75  REAL*8 :: x_source
76  REAL*8 :: y_source
77  REAL*8 :: r_source
78  REAL*8 :: vel_source
79  REAL*8 :: t_source
80  REAL*8 :: h_source
81  REAL*8, ALLOCATABLE :: alphas_source(:)
82  REAL*8 :: alphal_source
83  REAL*8 :: time_param(4)
84 
85 
87 
88  REAL*8 :: x_collapse
89  REAL*8 :: y_collapse
90  REAL*8 :: r_collapse
91  REAL*8 :: t_collapse
92  REAL*8 :: h_collapse
93  REAL*8, ALLOCATABLE :: alphas_collapse(:)
94 
95 
96 
98  REAL*8 :: released_volume
99 
101  REAL*8 :: x_release
102 
104  REAL*8 :: y_release
105 
108 
112  !.
113 
115 
117  REAL*8 :: t_init
118 
120  REAL*8, ALLOCATABLE :: alphas_init(:)
121 
122  REAL*8, ALLOCATABLE :: sed_vol_perc(:)
123 
124  INTEGER :: n_vars
125  INTEGER :: n_eqns
126 
127  INTEGER :: n_solid
128 
129  INTEGER :: n_nh
130 
131  INTEGER :: n_rk
132 
133  INTEGER, PARAMETER :: max_nl_iter = 100
134 
135  REAL*8, PARAMETER :: tol_abs = 1.d-5
136  REAL*8, PARAMETER :: tol_rel = 1.d-5
137 
144  INTEGER :: limiter(10) = -1
145 
151  CHARACTER(LEN=20) :: solver_scheme
152 
153  REAL*8 :: theta
154  REAL*8 :: t_start
155  REAL*8 :: t_end
156  REAL*8 :: t_output
157  REAL*8 :: dt_output
158  REAL*8 :: t_runout
159  REAL*8 :: t_steady
160 
161  INTEGER :: verbose_level
162 
163  TYPE bc
164  INTEGER :: flag
165  REAL*8 :: value
166  END TYPE bc
167 
168  ! -------boundary conditions variables
169 
178  TYPE(bc), ALLOCATABLE :: bcw(:)
179 
188  TYPE(bc), ALLOCATABLE :: bce(:)
189 
198  TYPE(bc), ALLOCATABLE :: bcs(:)
199 
208  TYPE(bc), ALLOCATABLE :: bcn(:)
209 
210 END MODULE parameters_2d
real *8 max_dt
Largest time step allowed.
logical topography_demfile
Flag for uploading topography from a different file (topography_dem.asc)
real *8 t_collapse
integer n_rk
Runge-Kutta order.
real *8 t_steady
end time when reached steady solution
real *8, parameter tol_rel
real *8 vel_source
real *8, dimension(:), allocatable alphas_init
Initial sediment concentration in the pile of material.
logical rheology_flag
Flag to choose if we add the rheology.
real *8 t_init
Initial temperature of the pile of material.
logical liquid_flag
Parameters.
real *8 y_release
Initial y-coordinate of the pile.
real *8 t_end
end time for the run
integer rheology_model
choice of the rheology model
type(bc), dimension(:), allocatable bcw
bcW&flag defines the west boundary condition:
real *8 velocity_ang_release
Initial velocity direction (angle in degree): .
real *8 velocity_mod_release
Initial velocity module of the pile.
real *8 released_volume
Initial volume of the flow.
real *8, dimension(4) time_param
integer n_vars
Number of conservative variables.
logical topo_change_flag
real *8, dimension(:), allocatable alphas_collapse
real *8 cfl
Courant-Friedrichs-Lewy parameter.
real *8, dimension(:), allocatable alphas_source
integer, parameter max_nl_iter
real *8 dt0
Initial time step.
real *8 alphal_source
real *8 x_release
Initial x-coordiante of the pile.
real *8 r_collapse
character(len=20) solver_scheme
Finite volume method: .
real *8 theta
Van Leer limiter parameter.
logical riemann_flag
Flag to choose the sort of problem to solve.
real *8 eps_newton
threshold for the convergence of the Newton's method
real *8 t_output
time of the next output
integer verbose_level
logical topography_function_flag
Flag to choose in which way we upload the topography.
real *8 h_collapse
logical energy_flag
Flag to choose the equation for temperature to solve.
integer, dimension(10) limiter
Limiter for the slope in the linear reconstruction: .
type(bc), dimension(:), allocatable bcn
bcN&flag defines the north boundary condition:
real *8 t_runout
time of the next runout output
integer n_eqns
Number of equations.
real *8, parameter tol_abs
real *8 reconstr_coeff
Slope coefficient in the linear reconstruction.
type(bc), dimension(:), allocatable bcs
bcS&flag defines the south boundary condition:
real *8 eps_sing
parameter for desingularization
type(bc), dimension(:), allocatable bce
bcE&flag defines the east boundary condition:
real *8 y_collapse
real *8 dt_output
time interval for the output of the solution
logical radial_source_flag
real *8 x_collapse
logical collapsing_volume_flag
integer n_solid
Number of solid classes.
logical interfaces_relaxation
Flag to add the relaxation terms after the linear reconstruction: .
real *8 t_start
initial time for the run
integer n_nh
Number of non-hyperbolic terms.
real *8, dimension(:), allocatable sed_vol_perc