MFC: Simulation
High-fidelity multiphase flow simulation
Loading...
Searching...
No Matches
m_igr Module Reference

Functions/Subroutines

subroutine, public s_initialize_igr_module ()
 
subroutine, public s_igr_iterative_solve (q_cons_vf, bc_type, t_step)
 
subroutine, public s_igr_sigma_x (q_cons_vf, rhs_vf)
 
subroutine, public s_igr_riemann_solver (q_cons_vf, rhs_vf, idir)
 
subroutine s_get_derived_states (e_l, gamma_l, pi_inf_l, rho_l, vel_l, e_r, gamma_r, pi_inf_r, rho_r, vel_r, pres_l, pres_r, cfl)
 
subroutine, public s_igr_flux_add (q_cons_vf, rhs_vf, flux_vf, idir)
 
subroutine, public s_finalize_igr_module ()
 

Variables

integer, dimension(3) nv_uvm_temp_on_gpu
 
real(wp), dimension(:, :, :), allocatable, pointer, target, contiguous jac
 
real(wp), dimension(:, :, :), allocatable, pointer, contiguous jac_rhs
 
real(wp), dimension(:, :, :), allocatable, pointer, contiguous jac_old
 
real(wp), dimension(:, :, :), allocatable pinned
 
real(wp), dimension(:, :, :), allocatable target
 
real(wp), dimension(:, :, :), allocatable jac_host
 
real(wp), dimension(:, :, :), allocatable jac_rhs_host
 
real(wp), dimension(:, :, :), allocatable jac_old_host
 
type(scalar_field), dimension(1) jac_sf
 
real(wp), dimension(:, :), allocatable res_igr
 
real(wpalf_igr
 
integer vidxb
 
integer vidxe
 
integer offxl
 
integer offxr
 
real(wp), dimension(:), allocatable coeff_l
 
real(wp), dimension(:), allocatable coeff_r
 
integer(kind=8) i
 
integer(kind=8) j
 
integer(kind=8) k
 
integer(kind=8) l
 
integer(kind=8) q
 
integer(kind=8) r
 

Function/Subroutine Documentation

◆ s_finalize_igr_module()

subroutine, public m_igr::s_finalize_igr_module
Here is the caller graph for this function:

◆ s_get_derived_states()

subroutine m_igr::s_get_derived_states ( real(wp), intent(in) e_l,
real(wp), intent(in) gamma_l,
real(wp), intent(in) pi_inf_l,
real(wp), intent(in) rho_l,
real(wp), dimension(num_dims), intent(in) vel_l,
real(wp), intent(in) e_r,
real(wp), intent(in) gamma_r,
real(wp), intent(in) pi_inf_r,
real(wp), intent(in) rho_r,
real(wp), dimension(num_dims), intent(in) vel_r,
real(wp), intent(out) pres_l,
real(wp), intent(out) pres_r,
real(wp), intent(out) cfl )
Here is the caller graph for this function:

◆ s_igr_flux_add()

subroutine, public m_igr::s_igr_flux_add ( type(scalar_field), dimension(sys_size), intent(inout) q_cons_vf,
type(scalar_field), dimension(sys_size), intent(inout) rhs_vf,
type(scalar_field), dimension(sys_size), intent(inout) flux_vf,
integer, intent(in) idir )

◆ s_igr_iterative_solve()

subroutine, public m_igr::s_igr_iterative_solve ( type(scalar_field), dimension(sys_size), intent(inout) q_cons_vf,
type(integer_field), dimension(1:num_dims, 1:2), intent(in) bc_type,
integer, intent(in) t_step )

◆ s_igr_riemann_solver()

subroutine, public m_igr::s_igr_riemann_solver ( type(scalar_field), dimension(sys_size), intent(inout) q_cons_vf,
type(scalar_field), dimension(sys_size), intent(inout) rhs_vf,
integer, intent(in) idir )
Here is the call graph for this function:

◆ s_igr_sigma_x()

subroutine, public m_igr::s_igr_sigma_x ( type(scalar_field), dimension(sys_size), intent(inout) q_cons_vf,
type(scalar_field), dimension(sys_size), intent(inout) rhs_vf )

◆ s_initialize_igr_module()

subroutine, public m_igr::s_initialize_igr_module
Here is the caller graph for this function:

Variable Documentation

◆ alf_igr

real(wp) m_igr::alf_igr

◆ coeff_l

real(wp), dimension(:), allocatable m_igr::coeff_l

◆ coeff_r

real(wp), dimension(:), allocatable m_igr::coeff_r

◆ i

integer(kind=8) m_igr::i

◆ j

integer(kind=8) m_igr::j

◆ jac

real(wp), dimension(:, :, :), allocatable, pointer, target, contiguous m_igr::jac

◆ jac_host

real(wp), dimension(:, :, :), allocatable m_igr::jac_host

◆ jac_old

real(wp), dimension(:, :, :), allocatable, pointer, contiguous m_igr::jac_old

◆ jac_old_host

real(wp), dimension(:, :, :), allocatable m_igr::jac_old_host

◆ jac_rhs

real(wp), dimension(:, :, :), allocatable, pointer, contiguous m_igr::jac_rhs

◆ jac_rhs_host

real(wp), dimension(:, :, :), allocatable m_igr::jac_rhs_host

◆ jac_sf

type(scalar_field), dimension(1) m_igr::jac_sf

◆ k

integer(kind=8) m_igr::k

◆ l

integer(kind=8) m_igr::l

◆ nv_uvm_temp_on_gpu

integer, dimension(3) m_igr::nv_uvm_temp_on_gpu

◆ offxl

integer m_igr::offxl

◆ offxr

integer m_igr::offxr

◆ pinned

real(wp), dimension(:, :, :), allocatable m_igr::pinned

◆ q

integer(kind=8) m_igr::q

◆ r

integer(kind=8) m_igr::r

◆ res_igr

real(wp), dimension(:, :), allocatable m_igr::res_igr

◆ target

real(wp), dimension(:, :, :), allocatable m_igr::target

◆ vidxb

integer m_igr::vidxb

◆ vidxe

integer m_igr::vidxe