MOM6
adjustment_initialization Module Reference

Detailed Description

Configures the model for the geostrophic adjustment test case.

Functions/Subroutines

subroutine, public adjustment_initialize_thickness (h, G, GV, US, param_file, just_read_params)
 Initializes the layer thicknesses in the adjustment test case. More...
 
subroutine, public adjustment_initialize_temperature_salinity (T, S, h, G, GV, param_file, eqn_of_state, just_read_params)
 Initialization of temperature and salinity in the adjustment test case. More...
 

Variables

character(len=40) mdl = "adjustment_initialization"
 This module's name.
 

Function/Subroutine Documentation

◆ adjustment_initialize_temperature_salinity()

subroutine, public adjustment_initialization::adjustment_initialize_temperature_salinity ( real, dimension(szi_(g),szj_(g), szk_(g)), intent(out)  T,
real, dimension(szi_(g),szj_(g), szk_(g)), intent(out)  S,
real, dimension(szi_(g),szj_(g), szk_(g)), intent(in)  h,
type(ocean_grid_type), intent(in)  G,
type(verticalgrid_type), intent(in)  GV,
type(param_file_type), intent(in)  param_file,
type(eos_type), pointer  eqn_of_state,
logical, intent(in), optional  just_read_params 
)

Initialization of temperature and salinity in the adjustment test case.

Parameters
[in]gThe ocean's grid structure.
[in]gvThe ocean's vertical grid structure.
[out]tThe temperature that is being initialized.
[out]sThe salinity that is being initialized.
[in]hThe model thicknesses [H ~> m or kg m-2].
[in]param_fileA structure indicating the open file to parse for model parameter values.
eqn_of_stateEquation of state.
[in]just_read_paramsIf present and true, this call will only read parameters without changing T & S.

Definition at line 187 of file adjustment_initialization.F90.

187  type(ocean_grid_type), intent(in) :: G !< The ocean's grid structure.
188  type(verticalGrid_type), intent(in) :: GV !< The ocean's vertical grid structure.
189  real, dimension(SZI_(G),SZJ_(G), SZK_(G)), intent(out) :: T !< The temperature that is being initialized.
190  real, dimension(SZI_(G),SZJ_(G), SZK_(G)), intent(out) :: S !< The salinity that is being initialized.
191  real, dimension(SZI_(G),SZJ_(G), SZK_(G)), intent(in) :: h !< The model thicknesses [H ~> m or kg m-2].
192  type(param_file_type), intent(in) :: param_file !< A structure indicating the open file to
193  !! parse for model parameter values.
194  type(EOS_type), pointer :: eqn_of_state !< Equation of state.
195  logical, optional, intent(in) :: just_read_params !< If present and true, this call will
196  !! only read parameters without changing T & S.
197 
198  integer :: i, j, k, is, ie, js, je, nz
199  real :: x, y, yy
200  integer :: index_bay_z
201  real :: S_ref, T_ref ! Reference salinity and temerature within
202  ! surface layer
203  real :: S_range, T_range ! Range of salinities and temperatures over the
204  ! vertical
205  real :: xi0, xi1, dSdz, delta_S, delta_S_strat
206  real :: adjustment_width, adjustment_deltaS
207  real :: front_wave_amp, front_wave_length, front_wave_asym
208  real :: eta1d(SZK_(G)+1)
209  logical :: just_read ! If true, just read parameters but set nothing.
210  character(len=20) :: verticalCoordinate
211 
212  is = g%isc ; ie = g%iec ; js = g%jsc ; je = g%jec ; nz = g%ke
213 
214  just_read = .false. ; if (present(just_read_params)) just_read = just_read_params
215 
216  ! Parameters used by main model initialization
217  call get_param(param_file, mdl,"S_REF",s_ref,'Reference salinity', units='1e-3', &
218  fail_if_missing=.not.just_read, do_not_log=just_read)
219  call get_param(param_file, mdl,"T_REF",t_ref,'Reference temperature', units='C', &
220  fail_if_missing=.not.just_read, do_not_log=just_read)
221  call get_param(param_file, mdl,"S_RANGE",s_range,'Initial salinity range', units='1e-3', &
222  default=2.0, do_not_log=just_read)
223  call get_param(param_file, mdl,"T_RANGE",t_range,'Initial temperature range', units='C', &
224  default=0.0, do_not_log=just_read)
225  ! Parameters specific to this experiment configuration BUT logged in previous s/r
226  call get_param(param_file, mdl,"REGRIDDING_COORDINATE_MODE",verticalcoordinate, &
227  default=default_coordinate_mode, do_not_log=just_read)
228  call get_param(param_file, mdl,"ADJUSTMENT_WIDTH", adjustment_width, &
229  fail_if_missing=.not.just_read, do_not_log=.true.)
230  call get_param(param_file, mdl,"ADJUSTMENT_DELTAS", adjustment_deltas, &
231  fail_if_missing=.not.just_read, do_not_log=.true.)
232  call get_param(param_file, mdl,"DELTA_S_STRAT", delta_s_strat, &
233  fail_if_missing=.not.just_read, do_not_log=.true.)
234  call get_param(param_file, mdl,"FRONT_WAVE_AMP", front_wave_amp, default=0., &
235  do_not_log=.true.)
236  call get_param(param_file, mdl,"FRONT_WAVE_LENGTH",front_wave_length, &
237  default=0., do_not_log=.true.)
238  call get_param(param_file, mdl,"FRONT_WAVE_ASYM", front_wave_asym, default=0., &
239  do_not_log=.true.)
240 
241  if (just_read) return ! All run-time parameters have been read, so return.
242 
243  t(:,:,:) = 0.0
244  s(:,:,:) = 0.0
245 
246  ! Linear salinity profile
247  select case ( coordinatemode(verticalcoordinate) )
248 
249  case ( regridding_zstar, regridding_sigma )
250  dsdz = -delta_s_strat / g%max_depth
251  do j=js,je ; do i=is,ie
252  eta1d(nz+1) = -g%bathyT(i,j)
253  do k=nz,1,-1
254  eta1d(k) = eta1d(k+1) + h(i,j,k)*gv%H_to_Z
255  enddo
256  if (front_wave_length /= 0.) then
257  y = ( 0.125 + g%geoLatT(i,j) / front_wave_length ) * ( 4. * acos(0.) )
258  yy = 2. * ( g%geoLatT(i,j) - 0.5 * g%len_lat ) / front_wave_length
259  yy = min(1.0, yy); yy = max(-1.0, yy)
260  yy = yy * 2. * acos( 0. )
261  y = front_wave_amp*sin(y) + front_wave_asym*sin(yy)
262  else
263  y = 0.
264  endif
265  x = ( ( g%geoLonT(i,j) - 0.5 * g%len_lon ) + y ) / adjustment_width
266  x = min(1.0, x); x = max(-1.0, x)
267  x = x * acos( 0. )
268  delta_s = adjustment_deltas * 0.5 * (1. - sin( x ) )
269  do k=1,nz
270  s(i,j,k) = s_ref + delta_s + 0.5 * ( eta1d(k)+eta1d(k+1) ) * dsdz
271  x = abs(s(i,j,k) - 0.5*real(nz-1)/real(nz)*s_range)/s_range*real(2*nz)
272  x = 1. - min(1., x)
273  t(i,j,k) = x
274  enddo
275  ! x = GV%H_to_Z*sum(T(i,j,:)*h(i,j,:))
276  ! T(i,j,:) = (T(i,j,:) / x) * (G%max_depth*1.5/real(nz))
277  enddo ; enddo
278 
279  case ( regridding_layer, regridding_rho )
280  do k = 1,nz
281  s(:,:,k) = s_ref + s_range * ( (real(k)-0.5) / real( nz ) )
282  ! x = abs(S(1,1,k) - 0.5*real(nz-1)/real(nz)*S_range)/S_range*real(2*nz)
283  ! x = 1.-min(1., x)
284  ! T(:,:,k) = x
285  enddo
286 
287  case default
288  call mom_error(fatal,"adjustment_initialize_temperature_salinity: "// &
289  "Unrecognized i.c. setup - set ADJUSTMENT_IC")
290 
291  end select
292 

◆ adjustment_initialize_thickness()

subroutine, public adjustment_initialization::adjustment_initialize_thickness ( real, dimension(szi_(g),szj_(g),szk_(gv)), intent(out)  h,
type(ocean_grid_type), intent(in)  G,
type(verticalgrid_type), intent(in)  GV,
type(unit_scale_type), intent(in)  US,
type(param_file_type), intent(in)  param_file,
logical, intent(in), optional  just_read_params 
)

Initializes the layer thicknesses in the adjustment test case.

Parameters
[in]gThe ocean's grid structure.
[in]gvThe ocean's vertical grid structure.
[in]usA dimensional unit scaling type
[out]hThe thickness that is being initialized [H ~> m or kg m-2].
[in]param_fileA structure indicating the open file to parse for model parameter values.
[in]just_read_paramsIf present and true, this call will only read parameters without changing h.

Definition at line 36 of file adjustment_initialization.F90.

36  type(ocean_grid_type), intent(in) :: G !< The ocean's grid structure.
37  type(verticalGrid_type), intent(in) :: GV !< The ocean's vertical grid structure.
38  type(unit_scale_type), intent(in) :: US !< A dimensional unit scaling type
39  real, dimension(SZI_(G),SZJ_(G),SZK_(GV)), &
40  intent(out) :: h !< The thickness that is being initialized [H ~> m or kg m-2].
41  type(param_file_type), intent(in) :: param_file !< A structure indicating the open file
42  !! to parse for model parameter values.
43  logical, optional, intent(in) :: just_read_params !< If present and true, this call will
44  !! only read parameters without changing h.
45  ! Local variables
46  real :: e0(SZK_(G)+1) ! The resting interface heights, in depth units [Z ~> m], usually
47  ! negative because it is positive upward.
48  real :: eta1D(SZK_(G)+1)! Interface height relative to the sea surface
49  ! positive upward, in depth units [Z ~> m].
50  real :: x, y, yy, delta_S_strat, dSdz, delta_S, S_ref
51  real :: min_thickness, adjustment_width, adjustment_delta, adjustment_deltaS
52  real :: front_wave_amp, front_wave_length, front_wave_asym
53  real :: target_values(SZK_(G)+1)
54  logical :: just_read ! If true, just read parameters but set nothing.
55  character(len=20) :: verticalCoordinate
56 ! This include declares and sets the variable "version".
57 #include "version_variable.h"
58  integer :: i, j, k, is, ie, js, je, nz
59 
60  is = g%isc ; ie = g%iec ; js = g%jsc ; je = g%jec ; nz = g%ke
61 
62  just_read = .false. ; if (present(just_read_params)) just_read = just_read_params
63 
64  if (.not.just_read) &
65  call mom_mesg("initialize_thickness_uniform: setting thickness")
66 
67  ! Parameters used by main model initialization
68  if (.not.just_read) call log_version(param_file, mdl, version, "")
69  call get_param(param_file, mdl,"S_REF",s_ref,fail_if_missing=.true.,do_not_log=.true.)
70  call get_param(param_file, mdl,"MIN_THICKNESS",min_thickness,'Minimum layer thickness', &
71  units='m', default=1.0e-3, do_not_log=just_read, scale=us%m_to_Z)
72 
73  ! Parameters specific to this experiment configuration
74  call get_param(param_file, mdl,"REGRIDDING_COORDINATE_MODE",verticalcoordinate, &
75  default=default_coordinate_mode, do_not_log=just_read)
76  call get_param(param_file, mdl,"ADJUSTMENT_WIDTH",adjustment_width, &
77  "Width of frontal zone", &
78  units="same as x,y", fail_if_missing=.not.just_read, do_not_log=just_read)
79  call get_param(param_file, mdl,"DELTA_S_STRAT",delta_s_strat, &
80  "Top-to-bottom salinity difference of stratification", &
81  units="1e-3", fail_if_missing=.not.just_read, do_not_log=just_read)
82  call get_param(param_file, mdl,"ADJUSTMENT_DELTAS",adjustment_deltas, &
83  "Salinity difference across front", &
84  units="1e-3", fail_if_missing=.not.just_read, do_not_log=just_read)
85  call get_param(param_file, mdl,"FRONT_WAVE_AMP",front_wave_amp, &
86  "Amplitude of trans-frontal wave perturbation", &
87  units="same as x,y",default=0., do_not_log=just_read)
88  call get_param(param_file, mdl,"FRONT_WAVE_LENGTH",front_wave_length, &
89  "Wave-length of trans-frontal wave perturbation", &
90  units="same as x,y",default=0., do_not_log=just_read)
91  call get_param(param_file, mdl,"FRONT_WAVE_ASYM",front_wave_asym, &
92  "Amplitude of frontal asymmetric perturbation", &
93  default=0., do_not_log=just_read)
94 
95  if (just_read) return ! All run-time parameters have been read, so return.
96 
97  ! WARNING: this routine specifies the interface heights so that the last layer
98  ! is vanished, even at maximum depth. In order to have a uniform
99  ! layer distribution, use this line of code within the loop:
100  ! e0(k) = -G%max_depth * real(k-1) / real(nz)
101  ! To obtain a thickness distribution where the last layer is
102  ! vanished and the other thicknesses uniformly distributed, use:
103  ! e0(k) = -G%max_depth * real(k-1) / real(nz-1)
104 
105  dsdz = -delta_s_strat / g%max_depth
106 
107  select case ( coordinatemode(verticalcoordinate) )
108 
109  case ( regridding_layer, regridding_rho )
110  if (delta_s_strat /= 0.) then
111  ! This was previously coded ambiguously.
112  adjustment_delta = (adjustment_deltas / delta_s_strat) * g%max_depth
113  do k=1,nz+1
114  e0(k) = adjustment_delta - (g%max_depth + 2*adjustment_delta) * (real(k-1) / real(nz))
115  enddo
116  else
117  adjustment_delta = 2.*g%max_depth
118  do k=1,nz+1
119  e0(k) = -g%max_depth * (real(k-1) / real(nz))
120  enddo
121  endif
122  target_values(1) = gv%Rlay(1) + 0.5*(gv%Rlay(1)-gv%Rlay(2))
123  target_values(nz+1) = gv%Rlay(nz) + 0.5*(gv%Rlay(nz)-gv%Rlay(nz-1))
124  do k = 2,nz
125  target_values(k) = target_values(k-1) + ( gv%Rlay(nz) - gv%Rlay(1) ) / (nz-1)
126  enddo
127  target_values(:) = target_values(:) - 1000.
128  do j=js,je ; do i=is,ie
129  if (front_wave_length /= 0.) then
130  y = ( 0.125 + g%geoLatT(i,j) / front_wave_length ) * ( 4. * acos(0.) )
131  yy = 2. * ( g%geoLatT(i,j) - 0.5 * g%len_lat ) / adjustment_width
132  yy = min(1.0, yy); yy = max(-1.0, yy)
133  yy = yy * 2. * acos( 0. )
134  y = front_wave_amp*sin(y) + front_wave_asym*sin(yy)
135  else
136  y = 0.
137  endif
138  x = ( ( g%geoLonT(i,j) - 0.5 * g%len_lon ) + y ) / adjustment_width
139  x = min(1.0, x); x = max(-1.0, x)
140  x = x * acos( 0. )
141  delta_s = adjustment_deltas * 0.5 * (1. - sin( x ) )
142  do k=2,nz
143  if (dsdz /= 0.) then
144  eta1d(k) = ( target_values(k) - ( s_ref + delta_s ) ) / dsdz
145  else
146  eta1d(k) = e0(k) - (0.5*adjustment_delta) * sin( x )
147  endif
148  eta1d(k) = max( eta1d(k), -g%max_depth )
149  eta1d(k) = min( eta1d(k), 0. )
150  enddo
151  eta1d(1) = 0.; eta1d(nz+1) = -g%max_depth
152  do k=nz,1,-1
153  if (eta1d(k) > 0.) then
154  eta1d(k) = max( eta1d(k+1) + min_thickness, 0. )
155  h(i,j,k) = gv%Z_to_H * max( eta1d(k) - eta1d(k+1), min_thickness )
156  elseif (eta1d(k) <= (eta1d(k+1) + min_thickness)) then
157  eta1d(k) = eta1d(k+1) + min_thickness
158  h(i,j,k) = gv%Z_to_H * min_thickness
159  else
160  h(i,j,k) = gv%Z_to_H * (eta1d(k) - eta1d(k+1))
161  endif
162  enddo
163  enddo ; enddo
164 
165  case ( regridding_zstar, regridding_sigma )
166  do k=1,nz+1
167  eta1d(k) = -g%max_depth * (real(k-1) / real(nz))
168  eta1d(k) = max(min(eta1d(k), 0.), -g%max_depth)
169  enddo
170  do j=js,je ; do i=is,ie
171  do k=nz,1,-1
172  h(i,j,k) = gv%Z_to_H * (eta1d(k) - eta1d(k+1))
173  enddo
174  enddo ; enddo
175 
176  case default
177  call mom_error(fatal,"adjustment_initialize_thickness: "// &
178  "Unrecognized i.c. setup - set ADJUSTMENT_IC")
179 
180  end select
181