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 trunk/CONFIG/GYRE/EXP00 – NEMO

source: trunk/CONFIG/GYRE/EXP00/namelist @ 102

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

Initial revision

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