New URL for NEMO forge!   http://forge.nemo-ocean.eu

Since March 2022 along with NEMO 4.2 release, the code development moved to a self-hosted GitLab.
This present forge is now archived and remained online for history.
namelist_cfg in NEMO/branches/UKMO/NEMO_4.0-TRUNK_r14960_HPG/tests/SEAMOUNT/EXPREF – NEMO

source: NEMO/branches/UKMO/NEMO_4.0-TRUNK_r14960_HPG/tests/SEAMOUNT/EXPREF/namelist_cfg @ 15719

Last change on this file since 15719 was 15719, checked in by dbruciaferri, 2 years ago

updating tests from git repo

File size: 28.9 KB
Line 
1!!>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>
2!! NEMO/OCE :   Reference namelist_ref                                !!
3!!>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>
4!! NEMO/OCE  :  1 - Domain & run manager (namrun, namcfg, namdom, namtsd, namcrs, namc1d, namc1d_uvd)
5!! namelists    2 - Surface boundary (namsbc, namsbc_flx, namsbc_blk, namsbc_cpl,
6!!                                    namsbc_sas, namtra_qsr, namsbc_rnf,
7!!                                    namisf, namsbc_apr,
8!!                                    namsbc_ssr, namsbc_wave, namberg)
9!!              3 - lateral boundary (namlbc, namagrif, nambdy, nambdy_tide)
10!!              4 - top/bot boundary (namdrg, namdrg_top, namdrg_bot, nambbc, nambbl)
11!!              5 - Tracer           (nameos, namtra_adv, namtra_ldf, namtra_eiv, namtra_dmp)
12!!              6 - dynamics         (namdyn_adv, namdyn_vor, namdyn_hpg, namdyn_spg, namdyn_ldf)
13!!              7 - Vertical physics (namzdf, namzdf_ric, namzdf_tke, namzdf_gls, namzdf_iwm)
14!!              8 - diagnostics      (namnc4, namtrd, namspr, namflo, namhsb)
15!!              9 - Obs & Assim      (namobs, nam_asminc)
16!!             10 - miscellaneous    (nammpp, namctl, namsto)
17!!>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>
18
19!!======================================================================
20!!              ***  Domain & Run management namelists  ***           !!
21!!                                                                    !!
22!!   namrun       parameters of the run
23!!   namdom       space and time domain
24!!   namcfg       parameters of the configuration                       (default: user defined GYRE)
25!!   namwad       Wetting and drying                                    (default: OFF)
26!!   namtsd       data: temperature & salinity                          (default: OFF)
27!!   namcrs       coarsened grid (for outputs and/or TOP)               (ln_crs =T)
28!!   namc1d       1D configuration options                              ("key_c1d")
29!!   namc1d_dyndmp 1D newtonian damping applied on currents             ("key_c1d")
30!!   namc1d_uvd   1D data (currents)                                    ("key_c1d")
31!!======================================================================
32!
33!-----------------------------------------------------------------------
34&namusr_def    !    SEAMOUNT TEST CASE
35!-----------------------------------------------------------------------
36   ln_zco            = .false.      ! z-coordinate
37   ln_zps            = .false.      ! z-partial-step coordinate
38   ln_sco            = .true.       ! s-coordinate
39   rn_dx             = 4000.0       ! horizontal resolution  [m]
40   rn_length         = 380.0        ! length of domain      [km]
41   rn_width          = 288.0        ! width of domain       [km]
42   rn_dz             = 450.0        ! vertical   resolution  [m]
43   rn_initrho        = 0.1          ! Initial density perturbation magnitude
44   rn_s              = 2.0          ! Burger number (to control background density profile)
45   rn_bathy          = 4500.0       ! Max Depth
46   rn_seamountheight = 4050.0       ! Seamount height
47   rn_l              = 25000.0      ! Gaussian scale factor
48   rn_f              = 0.0001       ! Coriolis parameter
49   ln_exp_init       = .true.       ! Exponential decay density perturbation profile
50   ln_linear_init    = .false.      ! Linearly decreasing density perturbation
51/
52!-----------------------------------------------------------------------
53&namrun        !   parameters of the run
54!-----------------------------------------------------------------------
55   cn_exp      =  "SEAMOUNT_xxx"!  experience name
56   nn_it000    =       1        !  first time step
57   nn_itend    =       2000     !  last  time step (10 days)
58   nn_date0    =  19000101
59   nn_leapy    =      30        !  Leap year calendar (1) or not (0)
60   nn_stock    =    48000       !  frequency of creation of a restart file (modulo referenced to 1)
61
62   ln_clobber  = .true.         !  clobber (overwrite) an existing file
63   nn_istate   =       1        !  output the initial state (1) or not (0)
64/
65!-----------------------------------------------------------------------
66&namdom        !   time and space domain
67!-----------------------------------------------------------------------
68   ln_linssh   = .false.   !  =T  linear free surface  ==>>  model level are fixed in time
69   !
70   rn_Dt       = 432.     !  time step for the dynamics and tracer
71   ln_meshmask = .true.   !  =T create a mesh file
72/
73!-----------------------------------------------------------------------
74&namcfg        !   parameters of the configuration                      (default: use namusr_def in namelist_cfg)
75!-----------------------------------------------------------------------
76   ln_read_cfg = .false.     !  (=T) read the domain configuration file
77   ln_write_cfg = .true.    !  (=T) create the domain configuration file
78      cn_domcfg_out = "domain_cfg_out" ! newly created domain configuration filename
79/
80!-----------------------------------------------------------------------
81&namtile        !   parameters of the tiling
82!-----------------------------------------------------------------------
83   ln_tile = .false.     !  Use tiling (T) or not (F)
84   nn_ltile_i = 10       !  Length of tiles in i
85   nn_ltile_j = 10       !  Length of tiles in j
86/
87!!======================================================================
88!!            ***  Surface Boundary Condition namelists  ***          !!
89!!                                                                    !!
90!!   namsbc          surface boundary condition manager                 (default: NO selection)
91!!   namsbc_flx      flux               formulation                     (ln_flx     =T)
92!!   namsbc_blk      Bulk formulae formulation                          (ln_blk     =T)
93!!   namsbc_cpl      CouPLed            formulation                     ("key_oasis3" )
94!!   namsbc_sas      Stand-Alone Surface module                         (SAS_SRC  only)
95!!   namsbc_iif      Ice-IF: use observed ice cover                     (nn_ice = 1   )
96!!   namtra_qsr      penetrative solar radiation                        (ln_traqsr  =T)
97!!   namsbc_ssr      sea surface restoring term (for T and/or S)        (ln_ssr     =T)
98!!   namsbc_rnf      river runoffs                                      (ln_rnf     =T)
99!!   namsbc_apr      Atmospheric Pressure                               (ln_apr_dyn =T)
100!!   namsbc_wave     external fields from wave model                    (ln_wave    =T)
101!!   namberg         iceberg floats                                     (ln_icebergs=T)
102!!   namsbc_fwb      freshwater-budget adjustment                       (nn_fwb > 0)
103!!======================================================================
104!
105!-----------------------------------------------------------------------
106&namsbc        !   Surface Boundary Condition manager                   (default: NO selection)
107!-----------------------------------------------------------------------
108   nn_fsbc     = 1         !  frequency of SBC module call
109      !                    !  (control sea-ice & iceberg model call)
110                     ! Type of air-sea fluxes
111   ln_usr      = .true.    !  user defined formulation                  (T => check usrdef_sbc)
112/
113!!======================================================================
114!!               ***  Lateral boundary condition  ***                 !!
115!!                                                                    !!
116!!   namlbc        lateral momentum boundary condition                  (default: NO selection)
117!!   namagrif      agrif nested grid   (read by child model only)       ("key_agrif")
118!!   nam_tide      Tidal forcing                                        (default: OFF)
119!!   nambdy        Unstructured open boundaries                         (default: OFF)
120!!   nambdy_dta    Unstructured open boundaries - external data         (see  nambdy)
121!!   nambdy_tide   tidal forcing at open boundaries                     (default: OFF)
122!!======================================================================
123!
124!-----------------------------------------------------------------------
125&namlbc        !   lateral momentum boundary condition                  (default: NO selection)
126!-----------------------------------------------------------------------
127   !                    !  free slip  !   partial slip  !   no slip   ! strong slip
128   rn_shlat    =  0.0   !  shlat = 0  !  0 < shlat < 2  !  shlat = 2  !  2 < shlat
129/
130!!======================================================================
131!!                ***  Top/Bottom boundary condition  ***             !!
132!!                                                                    !!
133!!   namdrg        top/bottom drag coefficient                          (default: NO selection)
134!!   namdrg_top    top    friction                                      (ln_drg_OFF=F & ln_isfcav=T)
135!!   namdrg_bot    bottom friction                                      (ln_drg_OFF=F)
136!!   nambbc        bottom temperature boundary condition                (default: OFF)
137!!   nambbl        bottom boundary layer scheme                         (default: OFF)
138!!======================================================================
139!
140!-----------------------------------------------------------------------
141&namdrg        !   top/bottom drag coefficient                          (default: NO selection)
142!-----------------------------------------------------------------------
143   ln_drg_OFF  = .true.    !  free-slip       : Cd = 0                  (F => fill namdrg_bot
144   ln_lin      = .false.   !      linear  drag: Cd = Cd0 Uc0                   &   namdrg_top)
145   ln_non_lin  = .false.   !  non-linear  drag: Cd = Cd0 |U|
146   ln_loglayer = .false.   !  logarithmic drag: Cd = vkarmn/log(z/z0) |U|
147   !
148   ln_drgimp   = .false.    !  implicit top/bottom friction flag
149      ln_drgice_imp = .true.! implicit ice-ocean drag
150/
151!-----------------------------------------------------------------------
152&namdrg_top    !   TOP friction                                         (ln_drg_OFF =F & ln_isfcav=T)
153!-----------------------------------------------------------------------
154/
155!-----------------------------------------------------------------------
156&namdrg_bot    !   BOTTOM friction                                      (ln_drg_OFF =F)
157!-----------------------------------------------------------------------
158   rn_Cd0     =  0.0    !  drag coefficient [-]
159   rn_Uc0     =  0.0      !  ref. velocity [m/s] (linear drag=Cd0*Uc0)
160   rn_Cdmax   =  1.e-4    !  drag value maximum [-] (logarithmic drag)
161   rn_ke0     =  2.5e-3   !  background kinetic energy  [m2/s2] (non-linear cases)
162   rn_z0      =  3.e-3    !  roughness [m] (ln_loglayer=T)
163   ln_boost   = .false.   !  =T regional boost of Cd0 ; =F constant
164      rn_boost =  50.         !  local boost factor  [-]
165/
166!!======================================================================
167!!                        Tracer (T-S) namelists                      !!
168!!                                                                    !!
169!!   nameos        equation of state                                    (default: NO selection)
170!!   namtra_adv    advection scheme                                     (default: NO selection)
171!!   namtra_ldf    lateral diffusion scheme                             (default: NO selection)
172!!   namtra_mle    mixed layer eddy param. (Fox-Kemper param.)          (default: OFF)
173!!   namtra_eiv    eddy induced velocity param.                         (default: OFF)
174!!   namtra_dmp    T & S newtonian damping                              (default: OFF)
175!!======================================================================
176!
177!-----------------------------------------------------------------------
178&nameos        !   ocean Equation Of Seawater                           (default: NO selection)
179!-----------------------------------------------------------------------
180   ln_teos10   = .false.         !  = Use TEOS-10
181   ln_eos80    = .false.         !  = Use EOS80
182   ln_seos     = .false.         !  = Use S-EOS (simplified Eq.)
183   ln_eeos     = .true.          !  = Use E-EOS (exponential eq.)
184                                 !
185   !                     ! S-EOS coefficients (ln_seos=T):
186   !                             !  rd(T,S,Z)*rho0 = -a0*(1+.5*lambda*dT+mu*Z+nu*dS)*dT+b0*dS
187   rn_a0       =  1.6550e-1      !  thermal expension coefficient
188   rn_b0       =  0.0      !  saline  expension coefficient
189   rn_lambda1  =  0.0      !  cabbeling coeff in T^2  (=0 for linear eos)
190   rn_lambda2  =  0.0      !  cabbeling coeff in S^2  (=0 for linear eos)
191   rn_mu1      =  0.0      !  thermobaric coeff. in T (=0 for linear eos)
192   rn_mu2      =  0.0      !  thermobaric coeff. in S (=0 for linear eos)
193   rn_nu       =  0.0      !  cabbeling coeff in T*S  (=0 for linear eos)
194/
195!-----------------------------------------------------------------------
196&namtra_adv    !   advection scheme for tracer                          (default: NO selection)
197!-----------------------------------------------------------------------
198   ln_traadv_OFF = .false. !  No tracer advection
199   ln_traadv_cen = .true. !  2nd order centered scheme
200      nn_cen_h   =  2            !  =2/4, horizontal 2nd order CEN / 4th order CEN
201      nn_cen_v   =  2            !  =2/4, vertical   2nd order CEN / 4th order COMPACT
202   ln_traadv_fct = .false. !  FCT scheme
203      nn_fct_h   =  2            !  =2/4, horizontal 2nd / 4th order
204      nn_fct_v   =  2            !  =2/4, vertical   2nd / COMPACT 4th order
205   ln_traadv_mus = .false. !  MUSCL scheme
206      ln_mus_ups = .false.       !  use upstream scheme near river mouths
207   ln_traadv_ubs = .false. !  UBS scheme
208      nn_ubs_v   =  2            !  =2  , vertical 2nd order FCT / COMPACT 4th order
209   ln_traadv_qck = .false. !  QUICKEST scheme
210/
211!-----------------------------------------------------------------------
212&namtra_ldf    !   lateral diffusion scheme for tracers                 (default: NO selection)
213!-----------------------------------------------------------------------
214   !                       !  Operator type:
215   ln_traldf_OFF   = .true.   !  No explicit diffusion
216/
217!!======================================================================
218!!                      ***  Dynamics namelists  ***                  !!
219!!                                                                    !!
220!!   nam_vvl       vertical coordinate options                          (default: z-star)
221!!   namdyn_adv    formulation of the momentum advection                (default: NO selection)
222!!   namdyn_vor    advection scheme                                     (default: NO selection)
223!!   namdyn_hpg    hydrostatic pressure gradient                        (default: NO selection)
224!!   namdyn_spg    surface pressure gradient                            (default: NO selection)
225!!   namdyn_ldf    lateral diffusion scheme                             (default: NO selection)
226!!   namdta_dyn    offline TOP: dynamics read in files                  (OFF_SRC only)
227!!======================================================================
228!
229!-----------------------------------------------------------------------
230&nam_vvl       !   vertical coordinate options                          (default: z-star)
231!-----------------------------------------------------------------------
232   ln_vvl_zstar  = .true.           !  z-star vertical coordinate
233   ln_vvl_ztilde = .false.          !  z-tilde vertical coordinate: only high frequency variations
234   ln_vvl_layer  = .false.          !  full layer vertical coordinate
235   ln_vvl_ztilde_as_zstar = .false. !  ztilde vertical coordinate emulating zstar
236   ln_vvl_zstar_at_eqtor  = .false. !  ztilde near the equator
237   rn_ahe3       =  0.0             !  thickness diffusion coefficient
238   rn_rst_e3t    = 30.0             !  ztilde to zstar restoration timescale [days]
239   rn_lf_cutoff  =  5.0             !  cutoff frequency for low-pass filter  [days]
240   rn_zdef_max   =  0.9             !  maximum fractional e3t deformation
241   ln_vvl_dbg    = .false.          !  debug prints    (T/F)
242/
243!-----------------------------------------------------------------------
244&namdyn_adv    !   formulation of the momentum advection                (default: NO selection)
245!-----------------------------------------------------------------------
246   ln_dynadv_OFF = .false. !  linear dynamics (no momentum advection)
247   ln_dynadv_vec = .false. !  vector form - 2nd centered scheme
248     nn_dynkeg     = 0        ! grad(KE) scheme: =0   C2  ;  =1   Hollingsworth correction
249   ln_dynadv_cen2 = .true. !  flux form - 2nd order centered scheme
250   ln_dynadv_ubs = .false. !  flux form - 3rd order UBS      scheme
251/
252!-----------------------------------------------------------------------
253&namdyn_vor    !   Vorticity / Coriolis scheme                          (default: NO selection)
254!-----------------------------------------------------------------------
255   ln_dynvor_ene = .true. !  energy    conserving scheme
256   ln_dynvor_ens = .false. !  enstrophy conserving scheme
257   ln_dynvor_mix = .false. !  mixed scheme
258   ln_dynvor_enT = .false. !  energy conserving scheme (T-point)
259   ln_dynvor_eeT = .false. !  energy conserving scheme (een using e3t)
260   ln_dynvor_een = .false. !  energy & enstrophy scheme
261   !
262   ln_dynvor_msk = .false. !  vorticity multiplied by fmask (=T)        ==>>> PLEASE DO NOT ACTIVATE
263   !                       !  (f-point vorticity schemes only)
264   !
265   nn_e3f_typ = 0          !  type of e3f (EEN, ENE, ENS, MIX only)  =0  e3f = mi(mj(e3t))/4
266   !                       !                                         =1  e3f = mi(mj(e3t))/mi(mj( tmask))
267/
268!-----------------------------------------------------------------------
269&namdyn_hpg    !   Hydrostatic pressure gradient option                 (default: NO selection)
270!-----------------------------------------------------------------------
271   ln_hpg_zco  = .false.   !  z-coordinate - full steps
272   ln_hpg_zps  = .false.   !  z-coordinate - partial steps (interpolation)
273   ln_hpg_sco  = .true.   !  s-coordinate (standard jacobian formulation)
274   ln_hpg_isf  = .false.   !  s-coordinate (sco ) adapted to isf
275   ln_hpg_djc  = .false.   !  s-coordinate (Density Jacobian with Cubic polynomial)
276      ln_hpg_djc_vnh = .true.  !  hor.  bc type for djc scheme (T=von Neumann, F=linear extrapolation)
277      ln_hpg_djc_vnv = .true.  !  vert. bc type for djc scheme (T=von Neumann, F=linear extrapolation)
278   ln_hpg_prj  = .false.   !  s-coordinate (Pressure Jacobian scheme)
279/
280!-----------------------------------------------------------------------
281&namdyn_spg    !   surface pressure gradient                            (default: NO selection)
282!-----------------------------------------------------------------------
283   ln_dynspg_exp  = .false.   ! explicit free surface
284   ln_dynspg_ts   = .true.   ! split-explicit free surface
285         nn_e         = 36          ! =F : the number of sub-step in rn_Dt seconds
286/
287!-----------------------------------------------------------------------
288&namdyn_ldf    !   lateral diffusion on momentum                        (default: NO selection)
289!-----------------------------------------------------------------------
290   !                       !  Type of the operator :
291   ln_dynldf_OFF = .false.     !  No operator (i.e. no explicit diffusion)
292   nn_dynldf_typ = 0           !  =0 div-rot (default)   ;   =1 symmetric
293   ln_dynldf_lap = .true.     !    laplacian operator
294   ln_dynldf_blp = .false.     !  bilaplacian operator
295   !                       !  Direction of action  :
296   ln_dynldf_lev = .true.     !  iso-level
297   ln_dynldf_hor = .false.     !  horizontal  (geopotential)
298   ln_dynldf_iso = .false.     !  iso-neutral (lap only)
299   !                       !  Coefficient
300   nn_ahm_ijk_t  = 0           !  space/time variation of eddy coefficient :
301      !                             !  =-30  read in eddy_viscosity_3D.nc file
302      !                             !  =-20  read in eddy_viscosity_2D.nc file
303      !                             !  =  0  constant
304      !                             !  = 10  F(k)=c1d
305      !                             !  = 20  F(i,j)=F(grid spacing)=c2d
306      !                             !  = 30  F(i,j,k)=c2d*c1d
307      !                             !  = 31  F(i,j,k)=F(grid spacing and local velocity)
308      !                             !  = 32  F(i,j,k)=F(local gridscale and deformation rate)
309      !                        !  time invariant coefficients :  ahm = 1/2  Uv*Lv   (lap case)
310      !                             !                            or  = 1/12 Uv*Lv^3 (blp case)
311      rn_Uv      = 2.0              !  lateral viscous velocity [m/s] (nn_ahm_ijk_t= 0, 10, 20, 30)
312      rn_Lv      = 1.e+3            !  lateral viscous length   [m]   (nn_ahm_ijk_t= 0, 10)
313/
314!!======================================================================
315!!                     vertical physics namelists                     !!
316!!                                                                    !!
317!!    namzdf        vertical physics manager                            (default: NO selection)
318!!    namzdf_ric    richardson number vertical mixing                   (ln_zdfric=T)
319!!    namzdf_tke    TKE vertical mixing                                 (ln_zdftke=T)
320!!    namzdf_gls    GLS vertical mixing                                 (ln_zdfgls=T)
321!!    namzdf_osm    OSM vertical diffusion                              (ln_zdfosm=T)
322!!    namzdf_iwm    tidal mixing parameterization                       (ln_zdfiwm=T)
323!!======================================================================
324!
325!-----------------------------------------------------------------------
326&namzdf        !   vertical physics manager                             (default: NO selection)
327!-----------------------------------------------------------------------
328   !                       ! adaptive-implicit vertical advection
329   ln_zad_Aimp = .false.      !  Courant number dependent scheme (Shchepetkin 2015)
330   !
331   !                       ! type of vertical closure (required)
332   ln_zdfcst   = .true.       !  constant mixing
333   ln_zdfric   = .false.      !  local Richardson dependent formulation (T =>   fill namzdf_ric)
334   ln_zdftke   = .false.      !  Turbulent Kinetic Energy closure       (T =>   fill namzdf_tke)
335   ln_zdfgls   = .false.      !  Generic Length Scale closure           (T =>   fill namzdf_gls)
336   ln_zdfosm   = .false.      !  OSMOSIS BL closure                     (T =>   fill namzdf_osm)
337   !
338   !                       ! convection
339   ln_zdfevd   = .false.      !  enhanced vertical diffusion
340      nn_evdm     =    0         ! apply on tracer (=0) or on tracer and momentum (=1)
341      rn_evd      =  100.        ! mixing coefficient [m2/s]
342   ln_zdfnpc   = .false.      !  Non-Penetrative Convective algorithm
343      nn_npc      =    1         ! frequency of application of npc
344      nn_npcp     =  365         ! npc control print frequency
345   ln_zdfmfc   = .false.      !  Mass Flux Convection
346   !
347   ln_zdfddm   = .false.   ! double diffusive mixing
348      rn_avts  =    1.e-4     !  maximum avs (vertical mixing on salinity)
349      rn_hsbfr =    1.6       !  heat/salt buoyancy flux ratio
350   !
351   !                       ! gravity wave-driven vertical mixing
352   ln_zdfiwm   = .false.      ! internal wave-induced mixing            (T =>   fill namzdf_iwm)
353   ln_zdfswm   = .false.      ! surface  wave-induced mixing            (T => ln_wave=ln_sdw=T )
354   !
355   !                       ! coefficients
356   rn_avm0     =  0.0         !  vertical eddy viscosity   [m2/s]       (background Kz if ln_zdfcst=F)
357   rn_avt0     =  0.0         !  vertical eddy diffusivity [m2/s]       (background Kz if ln_zdfcst=F)
358   nn_avb      =    0         !  profile for background avt & avm (=1) or not (=0)
359   nn_havtb    =    0         !  horizontal shape for avtb (=1) or not (=0)
360/
361!!======================================================================
362!!                  ***  Diagnostics namelists  ***                   !!
363!!                                                                    !!
364!!   namtrd       dynamics and/or tracer trends                         (default: OFF)
365!!   namhsb       Heat and salt budgets                                 (default: OFF)
366!!   namdiu       Cool skin and warm layer models                       (default: OFF)
367!!   namdiu       Cool skin and warm layer models                       (default: OFF)
368!!   namflo       float parameters                                      (default: OFF)
369!!   nam_diadct   transports through some sections                      (default: OFF)
370!!   nam_dia25h   25h Mean Output                                       (default: OFF)
371!!   namnc4       netcdf4 chunking and compression settings             ("key_netcdf4")
372!!======================================================================
373!
374!-----------------------------------------------------------------------
375&namtrd        !   trend diagnostics                                    (default: OFF)
376!-----------------------------------------------------------------------
377   ln_glo_trd  = .false.   ! (T) global domain averaged diag for T, T^2, KE, and PE
378   ln_dyn_trd  = .true.   ! (T) 3D momentum trend output
379   ln_dyn_mxl  = .false.   ! (T) 2D momentum trends averaged over the mixed layer (not coded yet)
380   ln_vor_trd  = .false.   ! (T) 2D barotropic vorticity trends (not coded yet)
381   ln_KE_trd   = .false.   ! (T) 3D Kinetic   Energy     trends
382   ln_PE_trd   = .false.   ! (T) 3D Potential Energy     trends
383   ln_tra_trd  = .false.   ! (T) 3D tracer trend output
384   ln_tra_mxl  = .false.   ! (T) 2D tracer trends averaged over the mixed layer (not coded yet)
385   nn_trd      = 1       !  print frequency (ln_glo_trd=T) (unit=time step)
386/
387!!======================================================================
388!!               ***  Observation & Assimilation  ***                 !!
389!!                                                                    !!
390!!   namobs       observation and model comparison                      (default: OFF)
391!!   nam_asminc   assimilation increments                               ('key_asminc')
392!!======================================================================
393!
394!!======================================================================
395!!                  ***  Miscellaneous namelists  ***                 !!
396!!                                                                    !!
397!!   nammpp            Massively Parallel Processing                    ("key_mpp_mpi")
398!!   namctl            Control prints                                   (default: OFF)
399!!   namsto            Stochastic parametrization of EOS                (default: OFF)
400!!======================================================================
401!
402!-----------------------------------------------------------------------
403&nammpp        !   Massively Parallel Processing                        ("key_mpp_mpi")
404!-----------------------------------------------------------------------
405!   ln_listonly =  .false.  !  do nothing else than listing the best domain decompositions (with land domains suppression)
406   !                       !  if T: the largest number of cores tested is defined by max(mppsize, jpni*jpnj)
407!   ln_nnogather =  .true.  !  activate code to avoid mpi_allgather use at the northfold
408   jpni        =   0       !  number of processors following i (set automatically if < 1), see also ln_listonly = T
409   jpnj        =   0       !  number of processors following j (set automatically if < 1), see also ln_listonly = T
410!   nn_hls      =   1       !  halo width (applies to both rows and columns)
411/
412!-----------------------------------------------------------------------
413&namctl        !   Control prints                                       (default: OFF)
414!-----------------------------------------------------------------------
415   sn_cfctl%l_runstat = .TRUE.    ! switches and which areas produce reports with the proc integer settings.
416!   sn_cfctl%l_trcstat = .FALSE.   ! The default settings for the proc integers should ensure
417   sn_cfctl%l_oceout  = .FALSE.   ! that  all areas report.
418!   sn_cfctl%l_layout  = .FALSE.   !
419!   sn_cfctl%l_prtctl  = .FALSE.   !
420!   sn_cfctl%l_prttrc  = .FALSE.   !
421!   sn_cfctl%l_oasout  = .FALSE.   !
422!   sn_cfctl%procmin   = 0         ! Minimum area number for reporting [default:0]
423!   sn_cfctl%procmax   = 1000000   ! Maximum area number for reporting [default:1000000]
424!   sn_cfctl%procincr  = 1         ! Increment for optional subsetting of areas [default:1]
425!   sn_cfctl%ptimincr  = 1         ! Timestep increment for writing time step progress info
426!   nn_ictls    =    0             !  start i indice of control sum (use to compare mono versus
427!   nn_ictle    =    0             !  end   i indice of control sum        multi processor runs
428!   nn_jctls    =    0             !  start j indice of control               over a subdomain)
429!   nn_jctle    =    0             !  end   j indice of control
430!   nn_isplt    =    1             !  number of processors in i-direction
431!   nn_jsplt    =    1             !  number of processors in j-direction
432   ln_timing   = .true.          !  timing by routine write out in timing.output file
433!   ln_diacfl   = .false.          !  CFL diagnostics write out in cfl_diagnostics.ascii
434/
Note: See TracBrowser for help on using the repository browser.