MOM6
dumbbell_surface_forcing Module Reference

Detailed Description

Surface forcing for the dumbbell test case.

Data Types

type  dumbbell_surface_forcing_cs
 Control structure for the dumbbell test case forcing. More...
 

Functions/Subroutines

subroutine, public dumbbell_buoyancy_forcing (state, fluxes, day, dt, G, US, CS)
 Surface buoyancy (heat and fresh water) fluxes for the dumbbell test case. More...
 
subroutine, public dumbbell_dynamic_forcing (state, fluxes, day, dt, G, CS)
 Dynamic forcing for the dumbbell test case. More...
 
subroutine, public dumbbell_surface_forcing_init (Time, G, US, param_file, diag, CS)
 Reads and sets up the forcing for the dumbbell test case. More...
 

Function/Subroutine Documentation

◆ dumbbell_buoyancy_forcing()

subroutine, public dumbbell_surface_forcing::dumbbell_buoyancy_forcing ( type(surface), intent(inout)  state,
type(forcing), intent(inout)  fluxes,
type(time_type), intent(in)  day,
real, intent(in)  dt,
type(ocean_grid_type), intent(in)  G,
type(unit_scale_type), intent(in)  US,
type(dumbbell_surface_forcing_cs), pointer  CS 
)

Surface buoyancy (heat and fresh water) fluxes for the dumbbell test case.

Parameters
[in,out]stateA structure containing fields that describe the surface state of the ocean.
[in,out]fluxesA structure containing pointers to any possible forcing fields. Unused fields have NULL ptrs.
[in]dayTime of the fluxes.
[in]dtThe amount of time over which the fluxes apply [s]
[in]gThe ocean's grid structure
[in]usA dimensional unit scaling type
csA control structure returned by a previous call to dumbbell_surface_forcing_init

Definition at line 51 of file dumbbell_surface_forcing.F90.

51  type(surface), intent(inout) :: state !< A structure containing fields that
52  !! describe the surface state of the ocean.
53  type(forcing), intent(inout) :: fluxes !< A structure containing pointers to any
54  !! possible forcing fields. Unused fields
55  !! have NULL ptrs.
56  type(time_type), intent(in) :: day !< Time of the fluxes.
57  real, intent(in) :: dt !< The amount of time over which
58  !! the fluxes apply [s]
59  type(ocean_grid_type), intent(in) :: G !< The ocean's grid structure
60  type(unit_scale_type), intent(in) :: US !< A dimensional unit scaling type
61  type(dumbbell_surface_forcing_CS), pointer :: CS !< A control structure returned by a previous
62  !! call to dumbbell_surface_forcing_init
63  ! Local variables
64  real :: Temp_restore ! The temperature that is being restored toward [degC].
65  real :: Salin_restore ! The salinity that is being restored toward [ppt].
66  real :: density_restore ! The potential density that is being restored
67  ! toward [kg m-3].
68  real :: rhoXcp ! The mean density times the heat capacity [J m-3 degC-1].
69  integer :: i, j, is, ie, js, je
70  integer :: isd, ied, jsd, jed
71 
72  is = g%isc ; ie = g%iec ; js = g%jsc ; je = g%jec
73  isd = g%isd ; ied = g%ied ; jsd = g%jsd ; jed = g%jed
74 
75 
76  ! Allocate and zero out the forcing arrays, as necessary.
77  if (cs%use_temperature) then
78  call safe_alloc_ptr(fluxes%evap, isd, ied, jsd, jed)
79  call safe_alloc_ptr(fluxes%lprec, isd, ied, jsd, jed)
80  call safe_alloc_ptr(fluxes%fprec, isd, ied, jsd, jed)
81  call safe_alloc_ptr(fluxes%lrunoff, isd, ied, jsd, jed)
82  call safe_alloc_ptr(fluxes%frunoff, isd, ied, jsd, jed)
83  call safe_alloc_ptr(fluxes%vprec, isd, ied, jsd, jed)
84 
85  call safe_alloc_ptr(fluxes%sw, isd, ied, jsd, jed)
86  call safe_alloc_ptr(fluxes%lw, isd, ied, jsd, jed)
87  call safe_alloc_ptr(fluxes%latent, isd, ied, jsd, jed)
88  call safe_alloc_ptr(fluxes%sens, isd, ied, jsd, jed)
89  else ! This is the buoyancy only mode.
90  call safe_alloc_ptr(fluxes%buoy, isd, ied, jsd, jed)
91  endif
92 
93 
94  ! MODIFY THE CODE IN THE FOLLOWING LOOPS TO SET THE BUOYANCY FORCING TERMS.
95 
96  if ( cs%use_temperature ) then
97  ! Set whichever fluxes are to be used here. Any fluxes that
98  ! are always zero do not need to be changed here.
99  do j=js,je ; do i=is,ie
100  ! Fluxes of fresh water through the surface are in units of [kg m-2 s-1]
101  ! and are positive downward - i.e. evaporation should be negative.
102  fluxes%evap(i,j) = -0.0 * g%mask2dT(i,j)
103  fluxes%lprec(i,j) = 0.0 * g%mask2dT(i,j)
104 
105  ! vprec will be set later, if it is needed for salinity restoring.
106  fluxes%vprec(i,j) = 0.0
107 
108  ! Heat fluxes are in units of [W m-2] and are positive into the ocean.
109  fluxes%lw(i,j) = 0.0 * g%mask2dT(i,j)
110  fluxes%latent(i,j) = 0.0 * g%mask2dT(i,j)
111  fluxes%sens(i,j) = 0.0 * g%mask2dT(i,j)
112  fluxes%sw(i,j) = 0.0 * g%mask2dT(i,j)
113  enddo ; enddo
114  else ! This is the buoyancy only mode.
115  do j=js,je ; do i=is,ie
116  ! fluxes%buoy is the buoyancy flux into the ocean [L2 T-3 ~> m2 s-3]. A positive
117  ! buoyancy flux is of the same sign as heating the ocean.
118  fluxes%buoy(i,j) = 0.0 * g%mask2dT(i,j)
119  enddo ; enddo
120  endif
121 
122  if (cs%use_temperature .and. cs%restorebuoy) then
123  do j=js,je ; do i=is,ie
124  ! Set density_restore to an expression for the surface potential
125  ! density [kg m-3] that is being restored toward.
126  if (cs%forcing_mask(i,j)>0.) then
127  fluxes%vprec(i,j) = - (g%mask2dT(i,j) * (cs%Rho0*cs%Flux_const)) * &
128  ((cs%S_restore(i,j) - state%SSS(i,j)) / (0.5 * (cs%S_restore(i,j) + state%SSS(i,j))))
129 
130  endif
131  enddo ; enddo
132  endif
133 

Referenced by mom_surface_forcing::set_forcing().

Here is the caller graph for this function:

◆ dumbbell_dynamic_forcing()

subroutine, public dumbbell_surface_forcing::dumbbell_dynamic_forcing ( type(surface), intent(inout)  state,
type(forcing), intent(inout)  fluxes,
type(time_type), intent(in)  day,
real, intent(in)  dt,
type(ocean_grid_type), intent(in)  G,
type(dumbbell_surface_forcing_cs), pointer  CS 
)

Dynamic forcing for the dumbbell test case.

Parameters
[in,out]stateA structure containing fields that describe the surface state of the ocean.
[in,out]fluxesA structure containing pointers to any possible forcing fields. Unused fields have NULL ptrs.
[in]dayTime of the fluxes.
[in]dtThe amount of time over which the fluxes apply [s]
[in]gThe ocean's grid structure
csA control structure returned by a previous call to dumbbell_surface_forcing_init

Definition at line 138 of file dumbbell_surface_forcing.F90.

138  type(surface), intent(inout) :: state !< A structure containing fields that
139  !! describe the surface state of the ocean.
140  type(forcing), intent(inout) :: fluxes !< A structure containing pointers to any
141  !! possible forcing fields. Unused fields
142  !! have NULL ptrs.
143  type(time_type), intent(in) :: day !< Time of the fluxes.
144  real, intent(in) :: dt !< The amount of time over which
145  !! the fluxes apply [s]
146  type(ocean_grid_type), intent(in) :: G !< The ocean's grid structure
147  type(dumbbell_surface_forcing_CS), pointer :: CS !< A control structure returned by a previous
148  !! call to dumbbell_surface_forcing_init
149  ! Local variables
150  integer :: i, j, is, ie, js, je
151  integer :: isd, ied, jsd, jed
152  integer :: idays, isecs
153  real :: deg_rad, rdays
154 
155 
156  is = g%isc ; ie = g%iec ; js = g%jsc ; je = g%jec
157  isd = g%isd ; ied = g%ied ; jsd = g%jsd ; jed = g%jed
158 
159  deg_rad = atan(1.0)*4.0/180.
160 
161  call get_time(day,isecs,idays)
162  rdays = real(idays) + real(isecs)/8.64e4
163  ! This could be: rdays = time_type_to_real(day)/8.64e4
164 
165  ! Allocate and zero out the forcing arrays, as necessary.
166  call safe_alloc_ptr(fluxes%p_surf, isd, ied, jsd, jed)
167  call safe_alloc_ptr(fluxes%p_surf_full, isd, ied, jsd, jed)
168 
169  do j=js,je ; do i=is,ie
170  fluxes%p_surf(i,j) = cs%forcing_mask(i,j)* cs%slp_amplitude * &
171  g%mask2dT(i,j) * sin(deg_rad*(rdays/cs%slp_period))
172  fluxes%p_surf_full(i,j) = cs%forcing_mask(i,j) * cs%slp_amplitude * &
173  g%mask2dT(i,j) * sin(deg_rad*(rdays/cs%slp_period))
174  enddo ; enddo
175 

◆ dumbbell_surface_forcing_init()

subroutine, public dumbbell_surface_forcing::dumbbell_surface_forcing_init ( type(time_type), intent(in)  Time,
type(ocean_grid_type), intent(in)  G,
type(unit_scale_type), intent(in)  US,
type(param_file_type), intent(in)  param_file,
type(diag_ctrl), intent(in), target  diag,
type(dumbbell_surface_forcing_cs), pointer  CS 
)

Reads and sets up the forcing for the dumbbell test case.

Parameters
[in]timeThe current model time.
[in]gThe ocean's grid structure
[in]usA dimensional unit scaling type
[in]param_fileA structure to parse for run-time parameters
[in]diagA structure that is used to regulate diagnostic output.
csA pointer to the control structure for this module

Definition at line 180 of file dumbbell_surface_forcing.F90.

180  type(time_type), intent(in) :: Time !< The current model time.
181  type(ocean_grid_type), intent(in) :: G !< The ocean's grid structure
182  type(unit_scale_type), intent(in) :: US !< A dimensional unit scaling type
183  type(param_file_type), intent(in) :: param_file !< A structure to parse for run-time parameters
184  type(diag_ctrl), target, intent(in) :: diag !< A structure that is used to
185  !! regulate diagnostic output.
186  type(dumbbell_surface_forcing_CS), &
187  pointer :: CS !< A pointer to the control structure for this module
188  ! Local variables
189  real :: S_surf, S_range
190  real :: x, y
191  integer :: i, j
192 #include "version_variable.h"
193  character(len=40) :: mdl = "dumbbell_surface_forcing" ! This module's name.
194 
195  if (associated(cs)) then
196  call mom_error(warning, "dumbbell_surface_forcing_init called with an associated "// &
197  "control structure.")
198  return
199  endif
200  allocate(cs)
201  cs%diag => diag
202 
203  ! Read all relevant parameters and write them to the model log.
204  call log_version(param_file, mdl, version, "")
205  call get_param(param_file, mdl, "ENABLE_THERMODYNAMICS", cs%use_temperature, &
206  "If true, Temperature and salinity are used as state "//&
207  "variables.", default=.true.)
208 
209  call get_param(param_file, mdl, "G_EARTH", cs%G_Earth, &
210  "The gravitational acceleration of the Earth.", &
211  units="m s-2", default = 9.80, scale=us%m_to_L**2*us%Z_to_m*us%T_to_s**2)
212  call get_param(param_file, mdl, "RHO_0", cs%Rho0, &
213  "The mean ocean density used with BOUSSINESQ true to "//&
214  "calculate accelerations and the mass for conservation "//&
215  "properties, or with BOUSSINSEQ false to convert some "//&
216  "parameters from vertical units of m to kg m-2.", &
217  units="kg m-3", default=1035.0, scale=us%kg_m3_to_R)
218  call get_param(param_file, mdl, "DUMBBELL_SLP_AMP", cs%slp_amplitude, &
219  "Amplitude of SLP forcing in reservoirs.", &
220  units="kg m2 s-1", default = 10000.0)
221  call get_param(param_file, mdl, "DUMBBELL_SLP_PERIOD", cs%slp_period, &
222  "Periodicity of SLP forcing in reservoirs.", &
223  units="days", default = 1.0)
224  call get_param(param_file, mdl, "DUMBBELL_SLP_PERIOD", cs%slp_period, &
225  "Periodicity of SLP forcing in reservoirs.", &
226  units="days", default = 1.0)
227  call get_param(param_file, mdl,"INITIAL_SSS", s_surf, &
228  "Initial surface salinity", units="1e-3", default=34.0, do_not_log=.true.)
229  call get_param(param_file, mdl,"INITIAL_S_RANGE", s_range, &
230  "Initial salinity range (bottom - surface)", units="1e-3", &
231  default=2., do_not_log=.true.)
232 
233  call get_param(param_file, mdl, "RESTOREBUOY", cs%restorebuoy, &
234  "If true, the buoyancy fluxes drive the model back "//&
235  "toward some specified surface state with a rate "//&
236  "given by FLUXCONST.", default= .false.)
237  if (cs%restorebuoy) then
238  call get_param(param_file, mdl, "FLUXCONST", cs%Flux_const, &
239  "The constant that relates the restoring surface fluxes "//&
240  "to the relative surface anomalies (akin to a piston "//&
241  "velocity). Note the non-MKS units.", &
242  units="m day-1", scale=us%m_to_Z*us%T_to_s, fail_if_missing=.true.)
243  ! Convert CS%Flux_const from m day-1 to m s-1.
244  cs%Flux_const = cs%Flux_const / 86400.0
245 
246 
247  allocate(cs%forcing_mask(g%isd:g%ied, g%jsd:g%jed)); cs%forcing_mask(:,:)=0.0
248  allocate(cs%S_restore(g%isd:g%ied, g%jsd:g%jed))
249 
250  do j=g%jsc,g%jec
251  do i=g%isc,g%iec
252  ! Compute normalized zonal coordinates (x,y=0 at center of domain)
253  x = ( g%geoLonT(i,j) - g%west_lon ) / g%len_lon - 0.5
254  y = ( g%geoLatT(i,j) - g%south_lat ) / g%len_lat - 0.5
255  cs%forcing_mask(i,j)=0
256  cs%S_restore(i,j) = s_surf
257  if ((x>0.25)) then
258  cs%forcing_mask(i,j) = 1
259  cs%S_restore(i,j) = s_surf + s_range
260  elseif ((x<-0.25)) then
261  cs%forcing_mask(i,j) = 1
262  cs%S_restore(i,j) = s_surf - s_range
263  endif
264  enddo
265  enddo
266  endif
267 

References mom_error_handler::mom_error().

Here is the call graph for this function: