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 in tags/nemo_dev_x1/CONFIG/ORCA2_LIM/EXP00 – NEMO

source: tags/nemo_dev_x1/CONFIG/ORCA2_LIM/EXP00/namelist @ 9285

Last change on this file since 9285 was 7, checked in by opalod, 20 years ago

NEMO_ORCA2_LIM start

  • Property svn:eol-style set to native
  • Property svn:keywords set to Author Date Id Revision
File size: 21.6 KB
Line 
1!>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>
2! OPA namelist :  model option and parameter input
3! -------------
4!>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>
5!
6!-----------------------------------------------------------------------
7!       namrun   parameters of the run
8!-----------------------------------------------------------------------
9!  no         job number
10!  cexper     experience name for vairmer format
11!  ln_rstart  boolean term for restart (true or false)
12!  nrstdt     control of the restart timestep:
13!                = 0 ???
14!                = 1 ???
15!                = 2 ???
16!  nit000     number of the first time step
17!  nitend     number of the last time step
18!  ndate0     initial calendar date aammjj
19!  nleapy     Leap year calendar (0/1)
20!  nprint     level of print (0 no print)
21!  nstock     frequency of restart file
22!  nwrite     frequency of OUTPUT file
23!  nrunoff    = 0 no, 1 runoff, 2 runoff+river mouth ups adv
24!  ln_ctl     trend control print (expensive!)
25!
26!  CAUTION: for usual run scripts, logical value of
27!  *******  ln_rstart must be .true. or .false.
28!                     and NOT .TRUE. or .FALSE.
29&namrun
30   no         =       0
31   cexper     =  "DEV1"
32   ln_rstart  = .false.
33   nrstdt     =       0
34   nit000     =       1
35   nitend     =    5475
36   ndate0     =  010101
37   nleapy     =       0
38   nprint     =       0
39   nstock     =    5475
40   nwrite     =    5475
41   nrunoff    =       2
42   ln_ctl     =  .true.
43/
44!-----------------------------------------------------------------------
45!       nam_traadv   advection scheme for tracer (option not control by CPP keys)
46!-----------------------------------------------------------------------
47!  ln_traadv_cen2     2nd order centered scheme    (default T)
48!  ln_traadv_tvd      TVD scheme                   (default F)
49!  ln_traadv_muscl    MUSCL scheme                 (default F)
50!  ln_traadv_muscl2   MUSCL2 scheme                (default F)
51&nam_traadv
52   ln_traadv_cen2   =  .true.
53   ln_traadv_tvd    =  .false.
54   ln_traadv_muscl  =  .false.
55   ln_traadv_muscl2 =  .false.
56/
57!-----------------------------------------------------------------------
58!       nam_traldf   lateral diffusion scheme for tracer (option not control by CPP keys)
59!-----------------------------------------------------------------------
60!  Type of the operator :
61!     ln_traldf_lap    laplacian operator          (default T)
62!     ln_traldf_bilap  bilaplacian operator        (default F)
63!  Direction of action  :
64!     ln_traldf_level  iso-level                   (default F)
65!     ln_traldf_hor    horizontal (geopotential)   (default F)^**
66!     ln_traldf_iso    iso-neutral                 (default T)^*
67!  Coefficient
68!     aht0    horizontal eddy diffusivity for tracers (m2/s)
69!     ahtb0   background eddy diffusivity for isopycnal diffusion (m2/s)
70!     aeiv0   eddy induced velocity coefficient (m2/s)
71! ^* require key_ldfslp to compute the direction of the lateral diffusion
72! ^** require key_ldfslp in s-coordinate
73&nam_traldf
74   ln_traldf_lap    =  .true.
75   ln_traldf_bilap  =  .false.
76   ln_traldf_level  =  .false.
77   ln_traldf_hor    =  .false.
78   ln_traldf_iso    =  .true.
79   aht0    =  2000.
80   ahtb0   =     0.
81   aeiv0   =  2000.
82/
83!-----------------------------------------------------------------------
84!       nam_dynldf   lateral diffusion on momentum
85!-----------------------------------------------------------------------
86!  Type of the operator :
87!     ln_dynldf_lap    laplacian operator          (default T)
88!     ln_dynldf_bilap  bilaplacian operator        (default F)
89!  Direction of action  :
90!     ln_dynldf_level  iso-level                   (default F)
91!     ln_dynldf_hor    horizontal (geopotential)   (default F)^**
92!     ln_dynldf_iso    iso-neutral                 (default T)^*
93!  Coefficient
94!  ahm0    horizontal eddy viscosity for the dynamics (m2/s)
95!  ahmb0   background eddy viscosity for isopycnal diffusion (m2/s)
96&nam_dynldf
97   ln_dynldf_lap    =  .true.
98   ln_dynldf_bilap  =  .false.
99   ln_dynldf_level  =  .false.
100   ln_dynldf_hor    =  .true.
101   ln_dynldf_iso    =  .false.
102   ahm0    = 40000.
103   ahmb0   =     0.
104/
105!-----------------------------------------------------------------------
106!       namflg   algorithm flags (algorithm not control by CPP keys)
107!-----------------------------------------------------------------------
108!  ln_dynhpg_imp   hydrostatic pressure gradient: semi-implicit time scheme  (T)
109!                                                  centered      time scheme  (F)
110&namflg
111   ln_dynhpg_imp   =  .false.
112/
113!-----------------------------------------------------------------------
114!       nam_dynvor   option of physics/algorithm (not control by CPP keys)
115!-----------------------------------------------------------------------
116!  ln_dynvor_ens   vorticity trends: enstrophy conserving scheme (default T)
117!  ln_dynvor_ene      "         "  : energy conserving scheme    (default F)
118!  ln_dynvor_mix      "         "  : mixed scheme                (default F)
119&nam_dynvor
120/
121!-----------------------------------------------------------------------
122!       namtau   surface wind stress
123!-----------------------------------------------------------------------
124!  ntau000   gently increase the stress over the first ntau_rst time-steps
125!  tau0x     uniform value used as default surface heat flux
126!  tau0y     uniform value used as default solar radiation flux
127&namtau
128   ntau000 =      0
129   tau0x   =      0.e0
130   tau0y   =      0.e0
131/
132!-----------------------------------------------------------------------
133!       namflx   surface fluxes
134!-----------------------------------------------------------------------
135!  q0       uniform value used as default surface heat flux
136!  qsr0     uniform value used as default solar radiation flux
137!  emp0     uniform value used as default surface freswater budget (E-P)
138&namflx
139   q0      =      0.e0
140   qsr0    =      0.e0
141   emp0    =      0.e0
142/
143!-----------------------------------------------------------------------
144!       namdom   space and time domain (bathymetry, mesh, timestep)
145!-----------------------------------------------------------------------
146!  ntopo      = 0/1 ,compute/read the bathymetry file
147!               (mbathy, nb of T-ocean levels)
148!  e3zps_min  the thickness of the partial step is set larger than the
149!  e3zps_rat     the minimum of e3zps_min and e3zps_rat * e3t
150!                (N.B. 0<e3zps_rat<1)
151!  ngrid      = 0/1, compute/read the horizontal mesh
152!                  (coordinates, scale factors)
153!  nmsh       =1 create a mesh file (coordinates, scale factors, masks)
154!  nacc       the acceleration of convergence method
155!             = 0, no acceleration, rdt = rdttra
156!             = 1, acceleration used, rdt < rdttra(k)
157!  atfp       asselin time filter parameter
158!  rdt        time step for the dynamics (and tracer if nacc=0)
159!  rdtmin     minimum time step on tracers
160!  rdtmax     maximum time step on tracers
161!  rdth       depth variation of tracer time step
162!  nfice      frequency of ice model call
163!  nfbulk     frequency of bulk formulea call (not used if ice used)
164!  nclosea    = 0 no closed sea
165!             = 1 closed sea (Black Sea, Caspian Sea, Great US Lakes...)
166&namdom
167   ntopo     =     1
168   e3zps_min =     5.
169   e3zps_rat =     0.1
170   ngrid     =     1
171   nmsh      =     0
172   nacc      =     0
173   atfp      =     0.1
174   rdt       =  5760.
175   rdtmin    =  5760.
176   rdtmax    =  5760.
177   rdth      =   800.
178   nfice     =     5 
179   nfbulk    =     5 
180   nclosea   =     0
181/
182!-----------------------------------------------------------------------
183!       namfwb   freshwater budget correction
184!-----------------------------------------------------------------------
185!  ln_fwb     logical flag for freshwater budget correction (0 annual mean)
186&namfwb
187   ln_fwb    = .true.
188/
189!-----------------------------------------------------------------------
190!       namcro   cross land advection
191!-----------------------------------------------------------------------
192!  n_cla   advection between 2 ocean pts separates by land
193&namcla
194   n_cla   = 1
195/
196!-----------------------------------------------------------------------
197!       namzdf   vertical physics
198!-----------------------------------------------------------------------
199!  ln_zdfevd  enhanced vertical diffusion         (default T)
200!  ln_zdfnpc  Non-Penetrative Convection          (default T)
201!  avm0       vertical eddy viscosity for the dynamic (m2/s)
202!  avt0       vertical eddy diffusivity for tracers (m2/s)
203!  avevd      vertical coefficient for enhanced diffusion scheme (m2/s)
204!  nevdm      = 0  apply enhanced mixing on tracer only
205!             = 1  apply enhanced mixing on both tracer and momentum
206!  ln_zdfexp   vertical physics: (=T)  time splitting (T)     (Default=F)
207!                               (=F)  euler backward (F)
208!  n_zdfexp   number of sub-timestep for time splitting scheme
209&namzdf
210   ln_zdfevd = .true.
211   ln_zdfnpc = .false.
212   avm0     = 1.2e-4
213   avt0     = 1.2e-5
214   avevd    =   100.
215   nevdm    =     1
216   ln_zdfexp =  .false.
217   n_zdfexp =      3
218/
219!-----------------------------------------------------------------------
220!       namnpc   vnon penetrative convection
221!-----------------------------------------------------------------------
222!  nnpc1   non penetrative convective scheme frequency
223!  nnpc2   non penetrative convective scheme print frequency
224&namnpc
225   nnpc1  =      1
226   nnpc2  =    365
227/
228!-----------------------------------------------------------------------
229!       nambbl   bottom boundary layer scheme
230!-----------------------------------------------------------------------
231!  atrbbl   lateral tracer coeff. for bottom boundary layer scheme(m2/s)
232&nambbl
233   atrbbl = 10000.
234/
235!-----------------------------------------------------------------------
236!       namric   richardson number dependent vertical diffusion
237!                ( #ifdef "key_zdfrichardson" )
238!-----------------------------------------------------------------------
239!  avmri   maximum value of the vertical viscosity
240!  alp     coefficient of the parameterization
241!  nric    coefficient of the parameterization
242&namwri
243   avmri = 100.e-4
244   alp   =      5.
245   nric  =       2
246/
247!-----------------------------------------------------------------------
248!       namtke   turbulent eddy kinetic dependent vertical diffusion
249!                ( #ifdef "key_zdftke" )
250!-----------------------------------------------------------------------
251!  ln_rstke flag to restart with tke from a run without tke (default F)
252!  ediff    coef. to compute vertical eddy coef. (avt=ediff*mxl*sqrt(e) )
253!  ediss    coef. of the Kolmogoroff dissipation 
254!  ebb      coef. of the surface input of tke
255!  efave    coef. to applied to the tke diffusion ( avtke=efave*avm )
256!  emin     minimum value of tke (m^2/s^2)
257!  emin0    surface minimum value of tke (m^2/s^2)
258!  nitke    number of restart iterative loops
259!  ri_c     critic richardson number
260!  nmxl     flag on mixing length used
261!           = 0 bounded by the distance to surface and bottom
262!           = 1 bounded by the local vertical scale factor
263!           = 2 first vertical derivative of mixing length bounded by 1
264!  npdl     flag on prandtl number
265!           = 0 no vertical prandtl number (avt=avm)
266!           = 1 prandtl number function of richarson number (avt=pdl*avm)
267!           = 2 same as = 1 but a shapiro filter is applied on pdl
268!  nave     =  horizontal averaged (=1) or not (=0) of avt  (default =1)
269!  navb     = 0 cst background avt0, avm0 / =1 profile used on avtb
270&namtke
271   ln_rstke = .false.
272   ediff =       0.1
273   ediss =       0.7
274   ebb   =      3.75
275   efave =        1.
276   emin  =     1.e-6
277   emin0 =     1.e-4
278   nitke =        50
279   nmxl  =         2
280   npdl  =         1
281   navb  =         0
282/
283!-----------------------------------------------------------------------
284!       namddm   double diffusive mixing parameterization
285!-----------------------------------------------------------------------
286!   avts    maximum avs for dd mixing
287!   hsbfr   heat/salt buoyancy flux ratio
288&namddm
289      avts  = 1.e-4
290      hsbfr = 1.6
291/
292!-----------------------------------------------------------------------
293!       namlbc   lateral momentum boundary condition
294!-----------------------------------------------------------------------
295!  shlat   lateral boundary condition on velocity
296!                   shlat = 0 , free slip
297!               0 < shlat < 2 , partial slip
298!                   shlat = 2 , no slip
299!               2 < shlat     , strong slip
300&namlbc
301   shlat  =      2.
302/
303!-----------------------------------------------------------------------
304!       nambfr   bottom friction
305!-----------------------------------------------------------------------
306!  nbotfr  type of bottom friction
307!                  nbotfr = 0 , no slip
308!                  nbotfr = 1 , linear friction
309!                  nbotfr = 2 , nonlinear friction
310!                  nbotfr = 3 , free slip
311!  bfri1   bottom drag coefficient (linear case)
312!  bfri2   bottom drag coefficient (non linear case)
313!  bfeb2   bottom turbulent kinetic energy  (m^2/s^2)
314&nambfr
315   nbotfr =       1
316   bfri1  =   4.e-4
317   bfri2  =   1.e-3
318   bfeb2  =  2.5e-3
319/
320!-----------------------------------------------------------------------
321!       nambbc   bottom temperature boundary condition
322!-----------------------------------------------------------------------
323!  ngeo_flux  = 0 no geothermal heat flux
324!             = 1 constant geothermal heat flux
325!             = 2 variable geothermal heat flux (read in geothermal_heating.nc)
326!                 ( C A U T I O N : flux in mW/m2 in the NetCDF file )
327!  ngeo_flux_const   Constant value of geothermal heat flux (W/m2)
328&nambbc
329   ngeo_flux =  2
330   ngeo_flux_const = 86.4e-3
331/
332!-----------------------------------------------------------------------
333!       namqsr   penetrative solar radiation
334!-----------------------------------------------------------------------
335!  ln_traqsr : penetrative solar radiation (T) or not (F)     (Default=T)
336!  rabs       fraction of qsr associated with xsi1
337!  xsi1       first depth of extinction
338!  xsi2       second depth of extinction
339&namqsr
340   ln_traqsr = .true.
341   rabs     =   0.58
342   xsi1     =   0.35
343   xsi2     =   23.0
344/
345!-----------------------------------------------------------------------
346!       namtdp   tracer newtonian damping ('key_tradmp')
347!-----------------------------------------------------------------------
348!  ndmp    type of damping in temperature and salinity
349!          (='latitude', damping poleward of 'ndmp' degrees and function
350!             of the distance-to-coast. Red and Med Seas as ndmp=-1)
351!          (=-1 damping only in Med and Red Seas)
352!  ndmpf   =1 create a damping.coeff NetCDF file (the 3D damping array)
353!  nmldmp  type of damping in the mixed layer
354!          (=0 damping throughout the water column)
355!     (=1 no damping in the mixed layer defined by avt >5cm2/s )
356!     (=2 no damping in the mixed layer defined rho<rho(surf)+.01 )
357!  sdmp    surface time scale for internal damping (days)
358!  bdmp    bottom time scale for internal damping (days)
359!  hdmp    depth of transition between sdmp and bdmp (meters)
360&namtdp
361   ndmp   =   -1
362   ndmpf  =    1
363   nmldmp =    1
364   sdmp   =  50.
365   bdmp   = 360.
366   hdmp   = 800.
367/
368!-----------------------------------------------------------------------
369!       nameos   ocean physical parameters
370!-----------------------------------------------------------------------
371!  neos    type of equation of state and Brunt-Vaisala frequency
372!          = 0, UNESCO (formulation of Jackett and McDougall (1994)
373!                                         and of McDougall (1987) )
374!          = 1, linear: rho(T)   = rau0 * ( 1.028 - ralpha * T )
375!          = 2, linear: rho(T,S) = rau0 * ( rbeta * S - ralpha * T )
376!                               with rau0=1020 set in parcst routine
377!  ralpha  thermal expension coefficient (linear equation of state)
378!  rbeta   saline  expension coefficient (linear equation of state)
379&nameos
380   neos   =      0
381   ralpha =  2.e-4
382   rbeta  =  0.001
383/
384!-----------------------------------------------------------------------
385!       namsol   elliptic solver / island / free surface
386!-----------------------------------------------------------------------
387!  nsolv  elliptic solver (=1 preconditioned conjugate gradient: pcg)
388!                         (=2 successive-over-relaxation: sor)
389!                         (=3 FETI: fet, all require "key_feti" defined)
390!  nmax   maximum of iterations for the solver
391!  eps    absolute precision of the solver
392!  sor    optimal coefficient for sor solver
393!  epsisl absolute precision on stream function solver
394!  nmisl  maximum pcg iterations for island
395!  rnu    strength of the additional force used in free surface b.c.
396&namsol
397   nsolv  =      1
398   nmax   =    800
399   eps    =  1.E-6
400   sor    =   1.76
401   epsisl = 1.e-10
402   nmisl  =   4000
403   rnu    =     1.
404/
405!=======================================================================
406!   Diagnostics namelists
407!       namtrd    dynamics and/or tracer trends
408!       namgap    level mean model-data gap
409!       namznl    zonal mean heat & freshwater fluxes computation
410!       namspr    surface pressure in rigid-lid
411!=======================================================================
412!-----------------------------------------------------------------------
413!       namtrd    diagnostics on dynamics and/or tracer trends
414!                         ('key_diatrdyn' and/or 'key_diatrtra')
415!                 or mixed-layer trends ('key_diatrdmld')
416!-----------------------------------------------------------------------
417!  ntrd    time step frequency dynamics and tracers trends
418!  nctls   control surface type in mixed-layer trends (0,1 or n<jpk)
419&namtrd
420   ntrd  = 365
421   nctls =   0
422/
423!-----------------------------------------------------------------------
424!       namgap    level mean model-data gap ('key_diagap')
425!-----------------------------------------------------------------------
426!  ngap    time-step frequency of model-data gap computation
427!  nprg    time-step frequency of gap print in model output
428&namgap
429   ngap =  15
430   nprg =  10
431/
432!-----------------------------------------------------------------------
433!       namznl    zonal mean heat & freshwater fluxes computation
434!                 (#ifdef "key_diaznl")
435!-----------------------------------------------------------------------
436!  nfznl   time-step frequency of zonal mean fluxes computation
437&namznl
438   nfznl =  15
439/
440!-----------------------------------------------------------------------
441!       namspr  surface pressure diagnostic
442!-----------------------------------------------------------------------
443!  nmaxp   maximum of iterations for the solver
444!  epsp    absolute precision of the solver
445!  niterp  number of iteration done by the solver
446&namspr
447   nmaxp   =   1000
448   epsp    =  1.e-3
449   niterp  =    400
450/
451!-----------------------------------------------------------------------
452!       namcpl    coupled ocean/atmosphere model  (#ifdef "key_coupled")
453!-----------------------------------------------------------------------
454!  nexco   coupling frequency in time steps
455!  cchan   coupling technique 'PIPE' or 'CLIM'
456&namcpl
457   nexco            =         24
458   cchan            =     'PIPE'
459   nmodcpl          =          2
460   cplmodnam        =   'opa.xx'
461   cploasis         =    'Oasis'
462   nfldo2c          =          2
463   nflxc2o          =          6
464   ntauc2o          =          4
465   cpl_writ(1)      = 'SOSSTSST'
466   cpl_f_writ(1)    =   'ocesst'
467   cpl_writ(2)      = 'SOICECOV'
468   cpl_f_writ(2)    =   'oceice'
469   cpl_readflx(1)   = 'SONSFLDO'
470   cpl_f_readflx(1) =   'oceflx'
471   cpl_readflx(2)   = 'SOSHFLDO'
472   cpl_f_readflx(2) =   'oceflx'
473   cpl_readflx(3)   = 'SOTOPRSU'
474   cpl_f_readflx(3) =   'oceflx'
475   cpl_readflx(4)   = 'SOTFSHSU'
476   cpl_f_readflx(4) =   'oceflx'
477   cpl_readflx(5)   = 'SORUNCOA'
478   cpl_f_readflx(5) =   'oceflx'
479   cpl_readflx(6)   = 'SORIVFLU'
480   cpl_f_readflx(6) =   'oceflx'
481   cpl_readtau(1)   = 'SOZOTAUX'
482   cpl_f_readtau(1) =   'ocetau'
483   cpl_readtau(2)   = 'SOZOTAU2'
484   cpl_f_readtau(2) =   'ocetau'
485   cpl_readtau(3)   = 'SOMETAUY'
486   cpl_f_readtau(3) =   'ocetau'
487   cpl_readtau(4)   = 'SOMETAU2'
488   cpl_f_readtau(4) =   'ocetau'
489/
490!-----------------------------------------------------------------------
491!       namobc    open boundaries parameters (#ifdef key_obc)
492!-----------------------------------------------------------------------
493!  nobc_dta   = 0 the obc data are equal to the initial state
494!             = 1 the obc data are read in 'obc   .dta' files
495!  rdpeob  time relaxation (days) for the east open boundary
496!  rdpwob  time relaxation (days) for the west open boundary
497!  rdpnob  time relaxation (days) for the north open boundary
498!  rdpsob  time relaxation (days) for the south open boundary
499!  zbsic1  barotropic stream function on isolated coastline 1
500!   zbsic2  barotropic stream function on isolated coastline 2
501!  zbsic3  barotropic stream function on isolated coastline 3
502&namobc
503    nobc_dta =    0
504    rdpein   =    1.
505    rdpwin   =    1.
506    rdpnin   =   30.
507    rdpsin   =    1.
508    rdpeob   = 1500.
509    rdpwob   =   15.
510    rdpnob   =  150.
511    rdpsob   =   15.
512    zbsic1   =  140.e+6
513    zbsic2   =    1.e+6
514    zbsic3   =    0.
515/
516!-----------------------------------------------------------------------
517!       namflo    float parameters (#ifdef key_float)
518!-----------------------------------------------------------------------
519!  ln_rstflo   boolean term for float restart (true or false)
520!  nwritefl   frequency of float output file
521!  nstockfl   frequency of float restart file
522!  ln_argo    Argo type floats (stay at the surface each 10 days)
523!  ln_flork4  = T trajectories computed with a 4th order Runge-Kutta
524!             = F  (default)   computed with Blanke' scheme
525&namflo
526    ln_rstflo = .false.
527    nwritefl  =      75
528    nstockfl  =    5475
529    ln_argo   = .false.
530    ln_flork4 = .false.
531/
Note: See TracBrowser for help on using the repository browser.