MOM6
bfb_initialization Module Reference

Detailed Description

Initialization of the boundary-forced-basing configuration.

Functions/Subroutines

subroutine, public bfb_set_coord (Rlay, g_prime, GV, US, param_file, eqn_of_state)
 This subroutine specifies the vertical coordinate in terms of temperature at the surface and at the bottom. This case is set up in such a way that the temperature of the topmost layer is equal to the SST at the southern edge of the domain. The temperatures are then converted to densities of the top and bottom layers and linearly interpolated for the intermediate layers. More...
 
subroutine, public bfb_initialize_sponges_southonly (G, GV, US, use_temperature, tv, param_file, CSp, h)
 This subroutine sets up the sponges for the southern bouundary of the domain. Maximum damping occurs within 2 degrees lat of the boundary. The damping linearly decreases northward over the next 2 degrees. More...
 
subroutine write_bfb_log (param_file)
 Write output about the parameter values being used. More...
 

Variables

logical first_call = .true.
 Unsafe model variable. More...
 

Function/Subroutine Documentation

◆ bfb_initialize_sponges_southonly()

subroutine, public bfb_initialization::bfb_initialize_sponges_southonly ( type(ocean_grid_type), intent(in)  G,
type(verticalgrid_type), intent(in)  GV,
type(unit_scale_type), intent(in)  US,
logical, intent(in)  use_temperature,
type(thermo_var_ptrs), intent(in)  tv,
type(param_file_type), intent(in)  param_file,
type(sponge_cs), pointer  CSp,
real, dimension( : , : , : ), intent(in)  h 
)

This subroutine sets up the sponges for the southern bouundary of the domain. Maximum damping occurs within 2 degrees lat of the boundary. The damping linearly decreases northward over the next 2 degrees.

Parameters
[in]gThe ocean's grid structure
[in]gvThe ocean's vertical grid structure.
[in]usA dimensional unit scaling type
[in]use_temperatureIf true, temperature and salinity are used as state variables.
[in]tvA structure pointing to various thermodynamic variables
[in]param_fileA structure to parse for run-time parameters
cspA pointer to the sponge control structure
[in]hLayer thicknesses [H ~> m or kg m-2]

Definition at line 81 of file BFB_initialization.F90.

81  type(ocean_grid_type), intent(in) :: G !< The ocean's grid structure
82  type(verticalGrid_type), intent(in) :: GV !< The ocean's vertical grid structure.
83  type(unit_scale_type), intent(in) :: US !< A dimensional unit scaling type
84  logical, intent(in) :: use_temperature !< If true, temperature and salinity are used as
85  !! state variables.
86  type(thermo_var_ptrs), intent(in) :: tv !< A structure pointing to various thermodynamic variables
87  type(param_file_type), intent(in) :: param_file !< A structure to parse for run-time parameters
88  type(sponge_CS), pointer :: CSp !< A pointer to the sponge control structure
89  real, dimension(NIMEM_, NJMEM_, NKMEM_), &
90  intent(in) :: h !< Layer thicknesses [H ~> m or kg m-2]
91 
92  ! Local variables
93  real :: eta(SZI_(G),SZJ_(G),SZK_(G)+1) ! A temporary array for eta, in depth units [Z ~> m].
94  real :: Idamp(SZI_(G),SZJ_(G)) ! The inverse damping rate [s-1].
95  real :: H0(SZK_(G)) ! Resting layer thicknesses in depth units [Z ~> m].
96  real :: min_depth ! The minimum ocean depth in depth units [Z ~> m].
97  real :: damp, e_dense, damp_new, slat, wlon, lenlat, lenlon, nlat
98  character(len=40) :: mdl = "BFB_initialize_sponges_southonly" ! This subroutine's name.
99  integer :: i, j, k, is, ie, js, je, isd, ied, jsd, jed, nz
100 
101  is = g%isc ; ie = g%iec ; js = g%jsc ; je = g%jec ; nz = g%ke
102  isd = g%isd ; ied = g%ied ; jsd = g%jsd ; jed = g%jed
103 
104  eta(:,:,:) = 0.0 ; idamp(:,:) = 0.0
105 
106 ! Here the inverse damping time [s-1], is set. Set Idamp to 0 !
107 ! wherever there is no sponge, and the subroutines that are called !
108 ! will automatically set up the sponges only where Idamp is positive!
109 ! and mask2dT is 1. !
110 
111 ! Set up sponges for DOME configuration
112  call get_param(param_file, mdl, "MINIMUM_DEPTH", min_depth, &
113  "The minimum depth of the ocean.", units="m", default=0.0, scale=us%m_to_Z)
114 
115  call get_param(param_file, mdl, "SOUTHLAT", slat, &
116  "The southern latitude of the domain.", units="degrees")
117  call get_param(param_file, mdl, "LENLAT", lenlat, &
118  "The latitudinal length of the domain.", units="degrees")
119  call get_param(param_file, mdl, "WESTLON", wlon, &
120  "The western longitude of the domain.", units="degrees", default=0.0)
121  call get_param(param_file, mdl, "LENLON", lenlon, &
122  "The longitudinal length of the domain.", units="degrees")
123  nlat = slat + lenlat
124  do k=1,nz ; h0(k) = -g%max_depth * real(k-1) / real(nz) ; enddo
125 
126  ! Use for meridional thickness profile initialization
127 ! do k=1,nz ; H0(k) = -G%max_depth * real(k-1) / real(nz-1) ; enddo
128 
129  do i=is,ie; do j=js,je
130  if (g%geoLatT(i,j) < slat+2.0) then ; damp = 1.0
131  elseif (g%geoLatT(i,j) < slat+4.0) then
132  damp_new = 1.0*(slat+4.0-g%geoLatT(i,j))/2.0
133  else ; damp = 0.0
134  endif
135 
136  ! These will be streched inside of apply_sponge, so they can be in
137  ! depth space for Boussinesq or non-Boussinesq models.
138 
139  ! This section is used for uniform thickness initialization
140  do k = 1,nz; eta(i,j,k) = h0(k); enddo
141 
142  ! The below section is used for meridional temperature profile thickness initiation
143  ! do k = 1,nz; eta(i,j,k) = H0(k); enddo
144  ! if (G%geoLatT(i,j) > 40.0) then
145  ! do k = 1,nz
146  ! eta(i,j,k) = -G%Angstrom_Z*(k-1)
147  ! enddo
148  ! elseif (G%geoLatT(i,j) > 20.0) then
149  ! do k = 1,nz
150  ! eta(i,j,k) = min(H0(k) + (G%geoLatT(i,j) - 20.0)*(G%max_depth - nz*G%Angstrom_Z)/20.0, &
151  ! -(k-1)*G%Angstrom_Z)
152  ! enddo
153  ! endif
154  eta(i,j,nz+1) = -g%max_depth
155 
156  if (g%bathyT(i,j) > min_depth) then
157  idamp(i,j) = damp/86400.0
158  else ; idamp(i,j) = 0.0 ; endif
159  enddo ; enddo
160 
161 ! This call sets up the damping rates and interface heights.
162 ! This sets the inverse damping timescale fields in the sponges. !
163  call initialize_sponge(idamp, eta, g, param_file, csp, gv)
164 
165 ! Now register all of the fields which are damped in the sponge. !
166 ! By default, momentum is advected vertically within the sponge, but !
167 ! momentum is typically not damped within the sponge. !
168 
169  if (first_call) call write_bfb_log(param_file)
170 

References first_call, mom_sponge::initialize_sponge(), and write_bfb_log().

Referenced by mom_state_initialization::mom_initialize_state().

Here is the call graph for this function:
Here is the caller graph for this function:

◆ bfb_set_coord()

subroutine, public bfb_initialization::bfb_set_coord ( real, dimension( : ), intent(out)  Rlay,
real, dimension( : ), intent(out)  g_prime,
type(verticalgrid_type), intent(in)  GV,
type(unit_scale_type), intent(in)  US,
type(param_file_type), intent(in)  param_file,
type(eos_type), pointer  eqn_of_state 
)

This subroutine specifies the vertical coordinate in terms of temperature at the surface and at the bottom. This case is set up in such a way that the temperature of the topmost layer is equal to the SST at the southern edge of the domain. The temperatures are then converted to densities of the top and bottom layers and linearly interpolated for the intermediate layers.

Parameters
[out]rlayLayer potential density [R ~> kg m-3].
[out]g_primeThe reduced gravity at each interface [L2 Z-1 T-2 ~> m s-2].
[in]gvThe ocean's vertical grid structure
[in]usA dimensional unit scaling type
[in]param_fileA structure to parse for run-time parameters
eqn_of_stateInteger that selects the equation of state.

Definition at line 39 of file BFB_initialization.F90.

39  real, dimension(NKMEM_), intent(out) :: Rlay !< Layer potential density [R ~> kg m-3].
40  real, dimension(NKMEM_), intent(out) :: g_prime !< The reduced gravity at
41  !! each interface [L2 Z-1 T-2 ~> m s-2].
42  type(verticalGrid_type), intent(in) :: GV !< The ocean's vertical grid structure
43  type(unit_scale_type), intent(in) :: US !< A dimensional unit scaling type
44  type(param_file_type), intent(in) :: param_file !< A structure to parse for run-time parameters
45  type(EOS_type), pointer :: eqn_of_state !< Integer that selects the
46  !! equation of state.
47  ! Local variables
48  real :: drho_dt, SST_s, T_bot, rho_top, rho_bot
49  integer :: k, nz
50  character(len=40) :: mdl = "BFB_set_coord" ! This subroutine's name.
51 
52  call get_param(param_file, mdl, "DRHO_DT", drho_dt, &
53  "Rate of change of density with temperature.", &
54  units="kg m-3 K-1", default=-0.2, scale=us%kg_m3_to_R)
55  call get_param(param_file, mdl, "SST_S", sst_s, &
56  "SST at the suothern edge of the domain.", units="C", default=20.0)
57  call get_param(param_file, mdl, "T_BOT", t_bot, &
58  "Bottom Temp", units="C", default=5.0)
59  rho_top = gv%Rho0 + drho_dt*sst_s
60  rho_bot = gv%Rho0 + drho_dt*t_bot
61  nz = gv%ke
62 
63  do k = 1,nz
64  rlay(k) = (rho_bot - rho_top)/(nz-1)*real(k-1) + rho_top
65  if (k >1) then
66  g_prime(k) = (rlay(k) - rlay(k-1)) * gv%g_Earth / (gv%Rho0)
67  else
68  g_prime(k) = gv%g_Earth
69  endif
70  !Rlay(:) = 0.0
71  !g_prime(:) = 0.0
72  enddo
73 
74  if (first_call) call write_bfb_log(param_file)
75 

References first_call, and write_bfb_log().

Referenced by mom_coord_initialization::mom_initialize_coord().

Here is the call graph for this function:
Here is the caller graph for this function:

◆ write_bfb_log()

subroutine bfb_initialization::write_bfb_log ( type(param_file_type), intent(in)  param_file)
private

Write output about the parameter values being used.

Parameters
[in]param_fileA structure indicating the open file to parse for model parameter values.

Definition at line 175 of file BFB_initialization.F90.

175  type(param_file_type), intent(in) :: param_file !< A structure indicating the
176  !! open file to parse for model
177  !! parameter values.
178 
179 ! This include declares and sets the variable "version".
180 #include "version_variable.h"
181  character(len=40) :: mdl = "BFB_initialization" ! This module's name.
182 
183  call log_version(param_file, mdl, version)
184  first_call = .false.
185 

References first_call.

Referenced by bfb_initialize_sponges_southonly(), and bfb_set_coord().

Here is the caller graph for this function:

Variable Documentation

◆ first_call

logical bfb_initialization::first_call = .true.
private

Unsafe model variable.

Todo:
Remove this module variable

Definition at line 30 of file BFB_initialization.F90.

30 logical :: first_call = .true.

Referenced by bfb_initialize_sponges_southonly(), bfb_set_coord(), and write_bfb_log().