PLUME-MoM-TSM  1.0
VolcanicPlumeModel
parameters_2d.f90
Go to the documentation of this file.
1 !********************************************************************************
3 !
6 !********************************************************************************
8 
9  USE variables, ONLY : wp
10 
11  IMPLICIT NONE
12 
13  REAL(wp), PARAMETER :: tolh = 10.0_wp * epsilon(1.0_wp)
14 
15  REAL(wp) :: eps_newton
17 
18  REAL(wp) :: dt0
19 
20  REAL(wp) :: max_dt
21 
22  REAL(wp) :: cfl
23 
24  REAL(wp) :: eps_sing
25 
26  REAL(wp) :: reconstr_coeff
27 
33 
34  INTEGER :: rsource_cells
35 
36  REAL(wp) :: c_d
37 
38  REAL(wp) :: x_source
39  REAL(wp) :: y_source
40  REAL(wp) :: r_source
41  REAL(wp) :: h_source
42  REAL(wp) :: vel_source
43  REAL(wp) :: vol_flux_source
44  REAL(wp) :: u_source
45  REAL(wp) :: v_source
46  REAL(wp) :: dr_dz
47 
48  REAL(wp) :: time_param(4)
49 
50  INTEGER :: n_vars
51  INTEGER :: n_eqns
52 
53  INTEGER :: n_nh
54 
55  INTEGER :: n_rk
56 
57  INTEGER, PARAMETER :: max_nl_iter = 100
58 
59  REAL(wp), PARAMETER :: tol_abs = 1.e-5_wp
60  REAL(wp), PARAMETER :: tol_rel = 1.e-5_wp
61 
68  INTEGER :: limiter(10) = -1
69 
75  CHARACTER(LEN=20) :: solver_scheme
76 
77  REAL(wp) :: theta
78  REAL(wp) :: t_start
79  REAL(wp) :: t_end
80  REAL(wp) :: t_output
81  REAL(wp) :: dt_output
82  REAL(wp) :: t_runout
83  REAL(wp) :: t_steady
84 
85  INTEGER :: verbose_level
86 
87  TYPE bc
88  INTEGER :: flag
89  REAL(wp) :: value
90  END TYPE bc
91 
92  ! -------boundary conditions variables
93 
102  TYPE(bc), ALLOCATABLE :: bcw(:)
103 
112  TYPE(bc), ALLOCATABLE :: bce(:)
113 
122  TYPE(bc), ALLOCATABLE :: bcs(:)
123 
132  TYPE(bc), ALLOCATABLE :: bcn(:)
133 
134 END MODULE parameters_2d
real(wp) h_source
integer n_rk
Runge-Kutta order.
real(wp), parameter tolh
integer rsource_cells
real(wp) r_source
real(wp) dt0
Initial time step.
Parameters.
type(bc), dimension(:), allocatable bcw
bcW&flag defines the west boundary condition:
real(wp) t_output
time of the next output
integer n_vars
Number of conservative variables.
integer, parameter max_nl_iter
real(wp) dt_output
time interval for the output of the solution
real(wp) cfl
Courant-Friedrichs-Lewy parameter.
real(wp), parameter tol_abs
real(wp) t_runout
time of the next runout output
character(len=20) solver_scheme
Finite volume method: .
integer verbose_level
real(wp), parameter tol_rel
real(wp) t_end
end time for the run
real(wp) y_source
integer, dimension(10) limiter
Limiter for the slope in the linear reconstruction: .
integer, parameter wp
working precision
Definition: variables.f90:21
type(bc), dimension(:), allocatable bcn
bcN&flag defines the north boundary condition:
real(wp) vol_flux_source
real(wp) vel_source
integer n_eqns
Number of equations.
real(wp) max_dt
Largest time step allowed.
real(wp) t_start
initial time for the run
type(bc), dimension(:), allocatable bcs
bcS&flag defines the south boundary condition:
type(bc), dimension(:), allocatable bce
bcE&flag defines the east boundary condition:
real(wp), dimension(4) time_param
real(wp) u_source
real(wp) eps_newton
threshold for the convergence of the Newton's method
real(wp) v_source
real(wp) theta
Van Leer limiter parameter.
real(wp) eps_sing
parameter for desingularization
real(wp) x_source
real(wp) reconstr_coeff
Slope coefficient in the linear reconstruction.
Global variables.
Definition: variables.f90:10
logical interfaces_relaxation
Flag to add the relaxation terms after the linear reconstruction: .
integer n_nh
Number of non-hyperbolic terms.
real(wp) t_steady
end time when reached steady solution