MOM6
mom_dynamics_split_rk2::mom_dyn_split_rk2_cs Type Reference

Detailed Description

Module control structure.

Definition at line 67 of file MOM_dynamics_split_RK2.F90.

Collaboration diagram for mom_dynamics_split_rk2::mom_dyn_split_rk2_cs:
[legend]

Public variables and constants

real, dimension(:, :, :), allocatable cau
 CAu = f*v - u.grad(u) in m s-2. More...
 
real, dimension(:, :, :), allocatable pfu
 PFu = -dM/dx, in m s-2. More...
 
real, dimension(:, :, :), allocatable diffu
 Zonal acceleration due to convergence of the along-isopycnal. More...
 
real, dimension(:, :, :), allocatable visc_rem_u
 Both the fraction of the zonal momentum originally in a. More...
 
real, dimension(:, :, :), allocatable u_accel_bt
 The layers' zonal accelerations due to the difference between. More...
 
real, dimension(:, :, :), allocatable cav
 CAv = -f*u - u.grad(v) in m s-2. More...
 
real, dimension(:, :, :), allocatable pfv
 PFv = -dM/dy, in m s-2. More...
 
real, dimension(:, :, :), allocatable diffv
 Meridional acceleration due to convergence of the. More...
 
real, dimension(:, :, :), allocatable visc_rem_v
 Both the fraction of the meridional momentum originally in. More...
 
real, dimension(:, :, :), allocatable v_accel_bt
 The layers' meridional accelerations due to the difference between. More...
 
real, dimension(:, :), allocatable eta
 Instantaneous free surface height, in m. More...
 
real, dimension(:, :, :), allocatable u_av
 layer x-velocity with vertical mean replaced by time-mean barotropic velocity over a baroclinic timestep (m s-1) More...
 
real, dimension(:, :, :), allocatable v_av
 layer y-velocity with vertical mean replaced by time-mean barotropic velocity over a baroclinic timestep (m s-1) More...
 
real, dimension(:, :, :), allocatable h_av
 arithmetic mean of two successive layer thicknesses (m or kg m-2) More...
 
real, dimension(:, :), allocatable eta_pf
 instantaneous SSH used in calculating PFu and PFv (meter) More...
 
real, dimension(:, :), allocatable uhbt
 average x-volume or mass flux determined by barotropic solver (m3 s-1 or kg s-1). uhbt should (roughly?) equal to vertical sum of uh. More...
 
real, dimension(:, :), allocatable vhbt
 average y-volume or mass flux determined by barotropic solver (m3 s-1 or kg s-1). vhbt should (roughly?) equal to vertical sum of vh. More...
 
real, dimension(:, :, :), allocatable pbce
 pbce times eta gives the baroclinic pressure anomaly in each layer due to free surface height anomalies. pbce has units of m2 H-1 s-2. More...
 
real, dimension(:,:), pointer taux_bot => NULL()
 frictional x-bottom stress from the ocean to the seafloor (Pa) More...
 
real, dimension(:,:), pointer tauy_bot => NULL()
 frictional y-bottom stress from the ocean to the seafloor (Pa) More...
 
type(bt_cont_type), pointer bt_cont => NULL()
 A structure with elements that describe the effective summed open face areas as a function of barotropic flow. More...
 
logical bt_use_layer_fluxes
 If true, use the summed layered fluxes plus an adjustment due to a changed barotropic velocity in the barotropic continuity equation. More...
 
logical split_bottom_stress
 If true, provide the bottom stress calculated by the vertical viscosity to the barotropic solver. More...
 
logical calc_dtbt
 If true, calculate the barotropic time-step dynamically. More...
 
real be
 A nondimensional number from 0.5 to 1 that controls the backward weighting of the time stepping scheme. More...
 
real begw
 A nondimensional number from 0 to 1 that controls the extent to which the treatment of gravity waves is forward-backward (0) or simulated backward Euler (1). 0 is almost always used. More...
 
logical debug
 If true, write verbose checksums for debugging purposes. More...
 
logical module_is_initialized = .false.
 
integer id_uh = -1
 
integer id_vh = -1
 
integer id_umo = -1
 
integer id_vmo = -1
 
integer id_umo_2d = -1
 
integer id_vmo_2d = -1
 
integer id_pfu = -1
 
integer id_pfv = -1
 
integer id_cau = -1
 
integer id_cav = -1
 
integer id_uav = -1
 
integer id_vav = -1
 
integer id_u_bt_accel = -1
 
integer id_v_bt_accel = -1
 
type(diag_ctrl), pointer diag
 A structure that is used to regulate the timing of diagnostic output. More...
 
type(accel_diag_ptrs), pointer adp
 A structure pointing to the various accelerations in the momentum equations, which can later be used to calculate derived diagnostics like energy budgets. More...
 
type(cont_diag_ptrs), pointer cdp
 A structure with pointers to various terms in the continuity equations, which can later be used to calculate derived diagnostics like energy budgets. More...
 
type(hor_visc_cs), pointer hor_visc_csp => NULL()
 
type(continuity_cs), pointer continuity_csp => NULL()
 
type(coriolisadv_cs), pointer coriolisadv_csp => NULL()
 
type(pressureforce_cs), pointer pressureforce_csp => NULL()
 
type(barotropic_cs), pointer barotropic_csp => NULL()
 
type(vertvisc_cs), pointer vertvisc_csp => NULL()
 
type(set_visc_cs), pointer set_visc_csp => NULL()
 
type(tidal_forcing_cs), pointer tides_csp => NULL()
 
type(ocean_obc_type), pointer obc => NULL()
 A pointer to an open boundary condition type that specifies whether, where, and what open boundary conditions are used. If no open BCs are used, this pointer stays nullified. Flather OBCs use open boundary_CS as well. More...
 
type(update_obc_cs), pointer update_obc_csp => NULL()
 
type(ale_cs), pointer ale_csp => NULL()
 
type(group_pass_type) pass_eta
 
type(group_pass_type) pass_visc_rem
 
type(group_pass_type) pass_uvp
 
type(group_pass_type) pass_hp_uv
 
type(group_pass_type) pass_uv
 
type(group_pass_type) pass_h
 
type(group_pass_type) pass_av_uvh
 

Variables and constants

◆ adp

type(accel_diag_ptrs), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::adp

A structure pointing to the various accelerations in the momentum equations, which can later be used to calculate derived diagnostics like energy budgets.

Definition at line 149 of file MOM_dynamics_split_RK2.F90.

149  type(accel_diag_ptrs), pointer :: adp !< A structure pointing to the various

◆ ale_csp

type(ale_cs), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::ale_csp => NULL()

Definition at line 175 of file MOM_dynamics_split_RK2.F90.

175  type(ale_cs), pointer :: ale_csp => null()

◆ barotropic_csp

type(barotropic_cs), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::barotropic_csp => NULL()

Definition at line 163 of file MOM_dynamics_split_RK2.F90.

163  type(barotropic_cs), pointer :: barotropic_csp => null()

◆ be

real mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::be

A nondimensional number from 0.5 to 1 that controls the backward weighting of the time stepping scheme.

Definition at line 127 of file MOM_dynamics_split_RK2.F90.

127  real :: be !< A nondimensional number from 0.5 to 1 that controls

◆ begw

real mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::begw

A nondimensional number from 0 to 1 that controls the extent to which the treatment of gravity waves is forward-backward (0) or simulated backward Euler (1). 0 is almost always used.

Definition at line 129 of file MOM_dynamics_split_RK2.F90.

129  real :: begw !< A nondimensional number from 0 to 1 that controls

◆ bt_cont

type(bt_cont_type), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::bt_cont => NULL()

A structure with elements that describe the effective summed open face areas as a function of barotropic flow.

Definition at line 112 of file MOM_dynamics_split_RK2.F90.

112  type(bt_cont_type), pointer :: bt_cont => null() !< A structure with elements that describe the

◆ bt_use_layer_fluxes

logical mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::bt_use_layer_fluxes

If true, use the summed layered fluxes plus an adjustment due to a changed barotropic velocity in the barotropic continuity equation.

Definition at line 118 of file MOM_dynamics_split_RK2.F90.

118  logical :: bt_use_layer_fluxes !< If true, use the summed layered fluxes plus

◆ calc_dtbt

logical mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::calc_dtbt

If true, calculate the barotropic time-step dynamically.

Definition at line 124 of file MOM_dynamics_split_RK2.F90.

124  logical :: calc_dtbt !< If true, calculate the barotropic time-step

◆ cau

real, dimension( : , : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::cau

CAu = f*v - u.grad(u) in m s-2.

Definition at line 68 of file MOM_dynamics_split_RK2.F90.

68  real allocable_, dimension(NIMEMB_PTR_,NJMEM_,NKMEM_) :: &
69  cau, & !< CAu = f*v - u.grad(u) in m s-2.
70  pfu, & !< PFu = -dM/dx, in m s-2.
71  diffu, & !< Zonal acceleration due to convergence of the along-isopycnal
72  !! stress tensor, in m s-2.
73  visc_rem_u, & !< Both the fraction of the zonal momentum originally in a
74  !! layer that remains after a time-step of viscosity, and the
75  !! fraction of a time-step's worth of a barotropic acceleration
76  !! that a layer experiences after viscosity is applied.
77  !! Nondimensional between 0 (at the bottom) and 1 (far above).
78  u_accel_bt !< The layers' zonal accelerations due to the difference between

◆ cav

real, dimension( : , : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::cav

CAv = -f*u - u.grad(v) in m s-2.

Definition at line 81 of file MOM_dynamics_split_RK2.F90.

81  real allocable_, dimension(NIMEM_,NJMEMB_PTR_,NKMEM_) :: &
82  cav, & !< CAv = -f*u - u.grad(v) in m s-2.
83  pfv, & !< PFv = -dM/dy, in m s-2.
84  diffv, & !< Meridional acceleration due to convergence of the
85  !! along-isopycnal stress tensor, in m s-2.
86  visc_rem_v, & !< Both the fraction of the meridional momentum originally in
87  !! a layer that remains after a time-step of viscosity, and the
88  !! fraction of a time-step's worth of a barotropic acceleration
89  !! that a layer experiences after viscosity is applied.
90  !! Nondimensional between 0 (at the bottom) and 1 (far above).
91  v_accel_bt !< The layers' meridional accelerations due to the difference between

◆ cdp

type(cont_diag_ptrs), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::cdp

A structure with pointers to various terms in the continuity equations, which can later be used to calculate derived diagnostics like energy budgets.

Definition at line 153 of file MOM_dynamics_split_RK2.F90.

153  type(cont_diag_ptrs), pointer :: cdp !< A structure with pointers to various

◆ continuity_csp

type(continuity_cs), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::continuity_csp => NULL()

Definition at line 160 of file MOM_dynamics_split_RK2.F90.

160  type(continuity_cs), pointer :: continuity_csp => null()

◆ coriolisadv_csp

type(coriolisadv_cs), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::coriolisadv_csp => NULL()

Definition at line 161 of file MOM_dynamics_split_RK2.F90.

161  type(coriolisadv_cs), pointer :: coriolisadv_csp => null()

◆ debug

logical mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::debug

If true, write verbose checksums for debugging purposes.

Definition at line 133 of file MOM_dynamics_split_RK2.F90.

133  logical :: debug !< If true, write verbose checksums for debugging purposes.

◆ diag

type(diag_ctrl), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::diag

A structure that is used to regulate the timing of diagnostic output.

Definition at line 147 of file MOM_dynamics_split_RK2.F90.

147  type(diag_ctrl), pointer :: diag !< A structure that is used to regulate the

◆ diffu

real, dimension( : , : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::diffu

Zonal acceleration due to convergence of the along-isopycnal.

Definition at line 68 of file MOM_dynamics_split_RK2.F90.

◆ diffv

real, dimension( : , : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::diffv

Meridional acceleration due to convergence of the.

Definition at line 81 of file MOM_dynamics_split_RK2.F90.

◆ eta

real, dimension( : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::eta

Instantaneous free surface height, in m.

Definition at line 96 of file MOM_dynamics_split_RK2.F90.

96  real allocable_, dimension(NIMEM_,NJMEM_) :: eta !< Instantaneous free surface height, in m.

◆ eta_pf

real, dimension( : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::eta_pf

instantaneous SSH used in calculating PFu and PFv (meter)

Definition at line 102 of file MOM_dynamics_split_RK2.F90.

102  real allocable_, dimension(NIMEM_,NJMEM_) :: eta_pf !< instantaneous SSH used in calculating PFu and PFv (meter)

◆ h_av

real, dimension( : , : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::h_av

arithmetic mean of two successive layer thicknesses (m or kg m-2)

Definition at line 101 of file MOM_dynamics_split_RK2.F90.

101  real allocable_, dimension(NIMEM_,NJMEM_,NKMEM_) :: h_av !< arithmetic mean of two successive layer thicknesses (m or kg m-2)

◆ hor_visc_csp

type(hor_visc_cs), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::hor_visc_csp => NULL()

Definition at line 159 of file MOM_dynamics_split_RK2.F90.

159  type(hor_visc_cs), pointer :: hor_visc_csp => null()

◆ id_cau

integer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::id_cau = -1

Definition at line 141 of file MOM_dynamics_split_RK2.F90.

141  integer :: id_cau = -1, id_cav = -1

◆ id_cav

integer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::id_cav = -1

Definition at line 141 of file MOM_dynamics_split_RK2.F90.

◆ id_pfu

integer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::id_pfu = -1

Definition at line 140 of file MOM_dynamics_split_RK2.F90.

140  integer :: id_pfu = -1, id_pfv = -1

◆ id_pfv

integer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::id_pfv = -1

Definition at line 140 of file MOM_dynamics_split_RK2.F90.

◆ id_u_bt_accel

integer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::id_u_bt_accel = -1

Definition at line 145 of file MOM_dynamics_split_RK2.F90.

145  integer :: id_u_bt_accel = -1, id_v_bt_accel = -1

◆ id_uav

integer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::id_uav = -1

Definition at line 144 of file MOM_dynamics_split_RK2.F90.

144  integer :: id_uav = -1, id_vav = -1

◆ id_uh

integer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::id_uh = -1

Definition at line 137 of file MOM_dynamics_split_RK2.F90.

137  integer :: id_uh = -1, id_vh = -1

◆ id_umo

integer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::id_umo = -1

Definition at line 138 of file MOM_dynamics_split_RK2.F90.

138  integer :: id_umo = -1, id_vmo = -1

◆ id_umo_2d

integer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::id_umo_2d = -1

Definition at line 139 of file MOM_dynamics_split_RK2.F90.

139  integer :: id_umo_2d = -1, id_vmo_2d = -1

◆ id_v_bt_accel

integer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::id_v_bt_accel = -1

Definition at line 145 of file MOM_dynamics_split_RK2.F90.

◆ id_vav

integer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::id_vav = -1

Definition at line 144 of file MOM_dynamics_split_RK2.F90.

◆ id_vh

integer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::id_vh = -1

Definition at line 137 of file MOM_dynamics_split_RK2.F90.

◆ id_vmo

integer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::id_vmo = -1

Definition at line 138 of file MOM_dynamics_split_RK2.F90.

◆ id_vmo_2d

integer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::id_vmo_2d = -1

Definition at line 139 of file MOM_dynamics_split_RK2.F90.

◆ module_is_initialized

logical mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::module_is_initialized = .false.

Definition at line 135 of file MOM_dynamics_split_RK2.F90.

135  logical :: module_is_initialized = .false.

◆ obc

type(ocean_obc_type), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::obc => NULL()

A pointer to an open boundary condition type that specifies whether, where, and what open boundary conditions are used. If no open BCs are used, this pointer stays nullified. Flather OBCs use open boundary_CS as well.

Definition at line 168 of file MOM_dynamics_split_RK2.F90.

168  type(ocean_obc_type), pointer :: obc => null() !< A pointer to an open boundary

◆ pass_av_uvh

type(group_pass_type) mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::pass_av_uvh

Definition at line 182 of file MOM_dynamics_split_RK2.F90.

◆ pass_eta

type(group_pass_type) mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::pass_eta

Definition at line 178 of file MOM_dynamics_split_RK2.F90.

178  type(group_pass_type) :: pass_eta

◆ pass_h

type(group_pass_type) mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::pass_h

Definition at line 182 of file MOM_dynamics_split_RK2.F90.

182  type(group_pass_type) :: pass_h, pass_av_uvh

◆ pass_hp_uv

type(group_pass_type) mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::pass_hp_uv

Definition at line 180 of file MOM_dynamics_split_RK2.F90.

180  type(group_pass_type) :: pass_hp_uv

◆ pass_uv

type(group_pass_type) mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::pass_uv

Definition at line 181 of file MOM_dynamics_split_RK2.F90.

181  type(group_pass_type) :: pass_uv

◆ pass_uvp

type(group_pass_type) mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::pass_uvp

Definition at line 179 of file MOM_dynamics_split_RK2.F90.

◆ pass_visc_rem

type(group_pass_type) mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::pass_visc_rem

Definition at line 179 of file MOM_dynamics_split_RK2.F90.

179  type(group_pass_type) :: pass_visc_rem, pass_uvp

◆ pbce

real, dimension( : , : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::pbce

pbce times eta gives the baroclinic pressure anomaly in each layer due to free surface height anomalies. pbce has units of m2 H-1 s-2.

Definition at line 107 of file MOM_dynamics_split_RK2.F90.

107  real allocable_, dimension(NIMEM_,NJMEM_,NKMEM_) :: pbce !< pbce times eta gives the baroclinic pressure anomaly in each layer due

◆ pfu

real, dimension( : , : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::pfu

PFu = -dM/dx, in m s-2.

Definition at line 68 of file MOM_dynamics_split_RK2.F90.

◆ pfv

real, dimension( : , : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::pfv

PFv = -dM/dy, in m s-2.

Definition at line 81 of file MOM_dynamics_split_RK2.F90.

◆ pressureforce_csp

type(pressureforce_cs), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::pressureforce_csp => NULL()

Definition at line 162 of file MOM_dynamics_split_RK2.F90.

162  type(pressureforce_cs), pointer :: pressureforce_csp => null()

◆ set_visc_csp

type(set_visc_cs), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::set_visc_csp => NULL()

Definition at line 165 of file MOM_dynamics_split_RK2.F90.

165  type(set_visc_cs), pointer :: set_visc_csp => null()

◆ split_bottom_stress

logical mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::split_bottom_stress

If true, provide the bottom stress calculated by the vertical viscosity to the barotropic solver.

Definition at line 121 of file MOM_dynamics_split_RK2.F90.

121  logical :: split_bottom_stress !< If true, provide the bottom stress

◆ taux_bot

real, dimension(:,:), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::taux_bot => NULL()

frictional x-bottom stress from the ocean to the seafloor (Pa)

Definition at line 110 of file MOM_dynamics_split_RK2.F90.

110  real, pointer, dimension(:,:) :: taux_bot => null() !< frictional x-bottom stress from the ocean to the seafloor (Pa)

◆ tauy_bot

real, dimension(:,:), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::tauy_bot => NULL()

frictional y-bottom stress from the ocean to the seafloor (Pa)

Definition at line 111 of file MOM_dynamics_split_RK2.F90.

111  real, pointer, dimension(:,:) :: tauy_bot => null() !< frictional y-bottom stress from the ocean to the seafloor (Pa)

◆ tides_csp

type(tidal_forcing_cs), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::tides_csp => NULL()

Definition at line 166 of file MOM_dynamics_split_RK2.F90.

166  type(tidal_forcing_cs), pointer :: tides_csp => null()

◆ u_accel_bt

real, dimension( : , : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::u_accel_bt

The layers' zonal accelerations due to the difference between.

Definition at line 68 of file MOM_dynamics_split_RK2.F90.

◆ u_av

real, dimension( : , : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::u_av

layer x-velocity with vertical mean replaced by time-mean barotropic velocity over a baroclinic timestep (m s-1)

Definition at line 97 of file MOM_dynamics_split_RK2.F90.

97  real allocable_, dimension(NIMEMB_PTR_,NJMEM_,NKMEM_) :: u_av !< layer x-velocity with vertical mean replaced by

◆ uhbt

real, dimension( : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::uhbt

average x-volume or mass flux determined by barotropic solver (m3 s-1 or kg s-1). uhbt should (roughly?) equal to vertical sum of uh.

Definition at line 103 of file MOM_dynamics_split_RK2.F90.

103  real allocable_, dimension(NIMEMB_PTR_,NJMEM_) :: uhbt !< average x-volume or mass flux determined by barotropic solver

◆ update_obc_csp

type(update_obc_cs), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::update_obc_csp => NULL()

Definition at line 172 of file MOM_dynamics_split_RK2.F90.

172  type(update_obc_cs), pointer :: update_obc_csp => null()

◆ v_accel_bt

real, dimension( : , : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::v_accel_bt

The layers' meridional accelerations due to the difference between.

Definition at line 81 of file MOM_dynamics_split_RK2.F90.

◆ v_av

real, dimension( : , : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::v_av

layer y-velocity with vertical mean replaced by time-mean barotropic velocity over a baroclinic timestep (m s-1)

Definition at line 99 of file MOM_dynamics_split_RK2.F90.

99  real allocable_, dimension(NIMEM_,NJMEMB_PTR_,NKMEM_) :: v_av !< layer y-velocity with vertical mean replaced by

◆ vertvisc_csp

type(vertvisc_cs), pointer mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::vertvisc_csp => NULL()

Definition at line 164 of file MOM_dynamics_split_RK2.F90.

164  type(vertvisc_cs), pointer :: vertvisc_csp => null()

◆ vhbt

real, dimension( : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::vhbt

average y-volume or mass flux determined by barotropic solver (m3 s-1 or kg s-1). vhbt should (roughly?) equal to vertical sum of vh.

Definition at line 105 of file MOM_dynamics_split_RK2.F90.

105  real allocable_, dimension(NIMEM_,NJMEMB_PTR_) :: vhbt !< average y-volume or mass flux determined by barotropic solver

◆ visc_rem_u

real, dimension( : , : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::visc_rem_u

Both the fraction of the zonal momentum originally in a.

Definition at line 68 of file MOM_dynamics_split_RK2.F90.

◆ visc_rem_v

real, dimension( : , : , : ), allocatable mom_dynamics_split_rk2::mom_dyn_split_rk2_cs::visc_rem_v

Both the fraction of the meridional momentum originally in.

Definition at line 81 of file MOM_dynamics_split_RK2.F90.


The documentation for this type was generated from the following file: