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 @ 523

Last change on this file since 523 was 523, checked in by opalod, 18 years ago

nemo_v1_compil_018 : CT : update BB_make files

  • Property svn:eol-style set to native
  • Property svn:keywords set to Author Date Id Revision
File size: 28.7 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!  ninist     initial state output flag (0/1)
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!
27!  CAUTION: for usual run scripts, logical value of
28!  *******  ln_rstart must be .true. or .false.
29!                     and NOT .TRUE. or .FALSE.
30&namrun
31   no         =       0
32   cexper     =  "GYRE"
33   ln_rstart  = .false.
34   nrstdt     =       0
35   nit000     =       1
36   nitend     =    4320
37   ndate0     =  010101
38   nleapy     =      30
39   ninist     =       0
40   nstock     =    4320
41   nwrite     =      60
42   nrunoff    =       0
43/
44!-----------------------------------------------------------------------
45!       nam_ctl      Control prints & Benchmark
46!-----------------------------------------------------------------------
47!  ln_ctl     trends control print (expensive!)
48!  nprint     level of print (0 no print)
49!  nictls     start i indice to make the control SUM (very usefull to compare mono-
50!  nictle     end   i indice to make the control SUM (-versus multi processor runs)
51!  njctls     start j indice to make the control SUM (very usefull to compare mono-
52!  njctle     end   j indice to make the control SUM (-versus multi processor runs)
53!  nisplt     number of processors following i
54!  njsplt     number of processors following j
55!  nbench     Bench parameter (0/1): CAUTION it must be zero except for bench
56!             for which we don't care about physical meaning of the results
57&namctl
58   ln_ctl =  .false.
59   nprint =       0
60   nictls =       0
61   nictle =       0
62   njctls =       0
63   njctle =       0
64   isplt  =       1
65   jsplt  =       1
66   nbench =       0
67/
68!-----------------------------------------------------------------------
69!       nam_mpp      Massively Parallel Processing
70!-----------------------------------------------------------------------
71!  c_mpi_send         mpi send/recieve type
72!                      = 'S'  : standard blocking send
73!                      = 'B'  : buffer blocking send
74!                      = 'I'  : immediate non-blocking send
75&nam_mpp
76   c_mpi_send =  'S'
77/
78!-----------------------------------------------------------------------
79!       nam_zgr       vertical coordinate
80!-----------------------------------------------------------------------
81!  ln_zco     z-coordinate - full steps      (T/F)
82!  ln_zps     z-coordinate - partial steps   (T/F)
83!  ln_sco     s- or hybrid z-s-coordinate    (T/F)
84&nam_zgr
85   ln_zco   =  .true.
86   ln_zps   =  .false.
87   ln_sco   =  .false.
88/
89!-----------------------------------------------------------------------
90!       nam_zgr_sco   s-coordinate or hybrid z-s-coordinate
91!-----------------------------------------------------------------------
92!  sbot_min   minimum depth of s-bottom surface (>0) (m)
93!  sbot_max   maximum depth of s-bottom surface (= ocean depth) (>0) (m)
94!  theta      surface control parameter (0<=theta<=20)
95!  thetb      bottom control parameter  (0<=thetb<= 1)
96!  r_max      maximum cut-off r-value allowed (0<r_max<1)
97&nam_zgr_sco
98   sbot_min =  300.
99   sbot_max = 5250.
100   theta    =    6.0
101   thetb    =    0.75
102   r_max    =    0.15
103/
104!-----------------------------------------------------------------------
105!       nam_traadv   advection scheme for tracer (option not control by CPP keys)
106!-----------------------------------------------------------------------
107!  ln_traadv_cen2     2nd order centered scheme    (default T)
108!  ln_traadv_tvd      TVD scheme                   (default F)
109!  ln_traadv_muscl    MUSCL scheme                 (default F)
110!  ln_traadv_muscl2   MUSCL2 scheme                (default F)
111!  ln_traadv_ubs      UBS scheme                   (default F)
112&nam_traadv
113   ln_traadv_cen2   =  .false.
114   ln_traadv_tvd    =  .true.
115   ln_traadv_muscl  =  .false.
116   ln_traadv_muscl2 =  .false.
117   ln_traadv_ubs    =  .false.
118/
119!-----------------------------------------------------------------------
120!       nam_traldf   lateral diffusion scheme for tracer (option not control by CPP keys)
121!-----------------------------------------------------------------------
122!  Type of the operator :
123!     ln_traldf_lap    laplacian operator          (default T)
124!     ln_traldf_bilap  bilaplacian operator        (default F)
125!  Direction of action  :
126!     ln_traldf_level  iso-level                   (default F)
127!     ln_traldf_hor    horizontal (geopotential)   (default F)^**
128!     ln_traldf_iso    iso-neutral                 (default T)^*
129!  Coefficient
130!     aht0    horizontal eddy diffusivity for tracers (m2/s)
131!     ahtb0   background eddy diffusivity for isopycnal diffusion (m2/s)
132!     aeiv0   eddy induced velocity coefficient (m2/s)
133! ^* require key_ldfslp to compute the direction of the lateral diffusion
134! ^** require key_ldfslp in s-coordinate
135&nam_traldf
136   ln_traldf_lap    =  .true.
137   ln_traldf_bilap  =  .false.
138   ln_traldf_level  =  .false.
139   ln_traldf_hor    =  .false.
140   ln_traldf_iso    =  .true.
141   aht0    =  1000.
142   ahtb0   =     0.
143   aeiv0   =  1000.
144/
145!-----------------------------------------------------------------------
146!       nam_dynldf   lateral diffusion on momentum
147!-----------------------------------------------------------------------
148!  Type of the operator :
149!     ln_dynldf_lap    laplacian operator          (default T)
150!     ln_dynldf_bilap  bilaplacian operator        (default F)
151!  Direction of action  :
152!     ln_dynldf_level  iso-level                   (default F)
153!     ln_dynldf_hor    horizontal (geopotential)   (default F)^**
154!     ln_dynldf_iso    iso-neutral                 (default T)^*
155!  Coefficient
156!  ahm0    horizontal eddy viscosity for the dynamics (m2/s)
157!  ahmb0   background eddy viscosity for isopycnal diffusion (m2/s)
158&nam_dynldf
159   ln_dynldf_lap    =  .true.
160   ln_dynldf_bilap  =  .false.
161   ln_dynldf_level  =  .false.
162   ln_dynldf_hor    =  .true.
163   ln_dynldf_iso    =  .false.
164   ahm0    = 100000.
165   ahmb0   =      0.
166/
167!-----------------------------------------------------------------------
168!       namflg   algorithm flags (algorithm not control by CPP keys)
169!-----------------------------------------------------------------------
170!  ln_dynhpg_imp   hydrostatic pressure gradient: semi-implicit time scheme  (T)
171!                                                  centered      time scheme  (F)
172&namflg
173   ln_dynhpg_imp   =  .false.
174/
175!-----------------------------------------------------------------------
176!       nam_dynhpg   Hydrostatic pressure gradient option
177!-----------------------------------------------------------------------
178!  type of pressure gradient scheme (choose one only!)
179!     ln_hpg_zco    z-coordinate - full steps                   (default T)
180!     ln_hpg_zps    z-coordinate - partial steps (interpolation)
181!     ln_hpg_sco    s-coordinate (standard jacobian formulation)
182!     ln_hpg_hel    s-coordinate (helsinki modification)
183!     ln_hpg_wdj    s-coordinate (weighted density jacobian)
184!     ln_hpg_djc    s-coordinate (Density Jacobian with Cubic polynomial)
185!     ln_hpg_rot    s-coordinate (ROTated axes scheme)
186!  parameters
187!    gamm          weighting coefficient (wdj scheme)
188&nam_dynhpg
189   ln_hpg_zco = .true.
190   ln_hpg_zps = .false.
191   ln_hpg_sco = .false.
192   ln_hpg_hel = .false.
193   ln_hpg_wdj = .false.
194   ln_hpg_djc = .false.
195   ln_hpg_rot = .false.
196   gamm       = 0.e0
197/
198!-----------------------------------------------------------------------
199!       nam_dynvor   option of physics/algorithm (not control by CPP keys)
200!-----------------------------------------------------------------------
201!  ln_dynvor_ens   vorticity trends: enstrophy conserving scheme (default T)
202!  ln_dynvor_ene      "         "  : energy conserving scheme    (default F)
203!  ln_dynvor_mix      "         "  : mixed scheme                (default F)
204!  ln_dynvor_een      "         "  : energy & enstrophy scheme   (default F)
205&nam_dynvor
206   ln_dynvor_ene = .TRUE.
207   ln_dynvor_ens = .FALSE.
208   ln_dynvor_mix = .FALSE.
209   ln_dynvor_een = .FALSE.
210/
211!-----------------------------------------------------------------------
212!       namtau   surface wind stress
213!-----------------------------------------------------------------------
214!  ntau000   gently increase the stress over the first ntau_rst time-steps
215!  tau0x     uniform value used as default surface heat flux
216!  tau0y     uniform value used as default solar radiation flux
217&namtau
218   ntau000 =    100
219   tau0x   =      0.1e0
220   tau0y   =      0.e0
221/
222!-----------------------------------------------------------------------
223!       namflx   surface fluxes
224!-----------------------------------------------------------------------
225!  q0       uniform value used as default surface heat flux
226!  qsr0     uniform value used as default solar radiation flux
227!  emp0     uniform value used as default surface freswater budget (E-P)
228!  dqdt0    feedback coefficient for SST damping (W/m2/K)
229!  deds0    feedback coefficient for SSS damping (mm/day)
230&namflx
231   q0      =      0.e0
232   qsr0    =      0.e0
233   emp0    =      0.e0
234   dqdt0   =     -40.0
235   deds0   =      27.7
236/
237!-----------------------------------------------------------------------
238!       namalb   albedo parameters
239!-----------------------------------------------------------------------
240!  cgren    correction of the snow or ice albedo to take into account
241!  albice   albedo of melting ice in the arctic and antarctic
242!  alphd    coefficients for linear interpolation used to compute albedo
243!           between two extremes values (Pyane, 1972)
244!  alphc     "                                         "
245!  alphdi    "                                         "
246&namalb
247   cgren    =      0.06
248   albice   =      0.5
249   alphd    =      0.80
250   alphc    =      0.65
251   alphdi   =      0.72
252/
253!-----------------------------------------------------------------------
254!       namdom   space and time domain (bathymetry, mesh, timestep)
255!-----------------------------------------------------------------------
256!  ntopo      = 0/1 ,compute/read the bathymetry file
257!               (mbathy, nb of T-ocean levels)
258!  e3zps_min  the thickness of the partial step is set larger than the
259!  e3zps_rat     the minimum of e3zps_min and e3zps_rat * e3t
260!                (N.B. 0<e3zps_rat<1)
261!  nmsh       =1 create a mesh file (coordinates, scale factors, masks)
262!  nacc       the acceleration of convergence method
263!             = 0, no acceleration, rdt = rdttra
264!             = 1, acceleration used, rdt < rdttra(k)
265!  atfp       asselin time filter parameter
266!  rdt        time step for the dynamics (and tracer if nacc=0)
267!  rdtmin     minimum time step on tracers
268!  rdtmax     maximum time step on tracers
269!  rdth       depth variation of tracer time step
270!  rdtbt      barotropic time step (for the time splitting algorithm)
271!  nfice      frequency of ice model call
272!  nfbulk     frequency of bulk formulea call (not used if ice used)
273!  nclosea    = 0 no closed sea
274!             = 1 closed sea (Black Sea, Caspian Sea, Great US Lakes...)
275&namdom
276   ntopo     =     0
277   e3zps_min =     5.
278   e3zps_rat =     0.1
279   nmsh      =     0
280   nacc      =     0
281   atfp      =     0.1
282   rdt       =  7200.
283   rdtmin    =  7200.
284   rdtmax    =  7200.
285   rdth      =   800.
286   rdtbt     =   120.
287   nfice     =     5 
288   nfbulk    =     5 
289   nclosea   =     0
290/
291!-----------------------------------------------------------------------
292!       namfwb   freshwater budget correction
293!-----------------------------------------------------------------------
294!  ln_fwb     logical flag for freshwater budget correction (0 annual mean)
295&namfwb
296   ln_fwb    = .false.
297/
298!-----------------------------------------------------------------------
299!       namptr   Poleward Transport Diagnostic
300!-----------------------------------------------------------------------
301!  ln_diaptr  logical flag for Poleward transport computation
302!  ln_subbas  logical flag for Atlantic/Pacific/Indian basins computation
303!             need input basins mask file named "subbasins.nc"
304!  nf_ptr     Frequency of computation
305&namptr
306   ln_diaptr = .false.
307   ln_subbas = .false.
308   nf_ptr    =  15
309/
310!-----------------------------------------------------------------------
311!       namcro   cross land advection
312!-----------------------------------------------------------------------
313!  n_cla   advection between 2 ocean pts separates by land
314&namcla
315   n_cla   = 0
316/
317!-----------------------------------------------------------------------
318!       namzdf   vertical physics
319!-----------------------------------------------------------------------
320!  ln_zdfevd  enhanced vertical diffusion         (default T)
321!  ln_zdfnpc  Non-Penetrative Convection          (default T)
322!  avm0       vertical eddy viscosity for the dynamic (m2/s)
323!  avt0       vertical eddy diffusivity for tracers (m2/s)
324!  avevd      vertical coefficient for enhanced diffusion scheme (m2/s)
325!  nevdm      = 0  apply enhanced mixing on tracer only
326!             = 1  apply enhanced mixing on both tracer and momentum
327!  ln_zdfexp   vertical physics: (=T)  time splitting (T)     (Default=F)
328!                               (=F)  euler backward (F)
329!  n_zdfexp   number of sub-timestep for time splitting scheme
330&namzdf
331   ln_zdfevd = .true.
332   ln_zdfnpc = .false.
333   avm0      = 1.2e-4
334   avt0      = 1.2e-5
335   avevd     =   100.
336   n_evdm    =     1
337   ln_zdfexp =  .false.
338   n_zdfexp  =     3
339/
340!-----------------------------------------------------------------------
341!       namnpc   vnon penetrative convection
342!-----------------------------------------------------------------------
343!  nnpc1   non penetrative convective scheme frequency
344!  nnpc2   non penetrative convective scheme print frequency
345&namnpc
346   nnpc1  =      1
347   nnpc2  =    365
348/
349!-----------------------------------------------------------------------
350!       nambbl   bottom boundary layer scheme
351!-----------------------------------------------------------------------
352!  atrbbl   lateral tracer coeff. for bottom boundary layer scheme(m2/s)
353&nambbl
354   atrbbl = 10000.
355/
356!-----------------------------------------------------------------------
357!       namric   richardson number dependent vertical diffusion
358!                ( #ifdef "key_zdfrichardson" )
359!-----------------------------------------------------------------------
360!  avmri   maximum value of the vertical viscosity
361!  alp     coefficient of the parameterization
362!  nric    coefficient of the parameterization
363&namric
364   avmri = 100.e-4
365   alp   =      5.
366   nric  =       2
367/
368!-----------------------------------------------------------------------
369!       namtke   turbulent eddy kinetic dependent vertical diffusion
370!                ( #ifdef "key_zdftke" )
371!-----------------------------------------------------------------------
372!  ln_rstke flag to restart with tke from a run without tke (default F)
373!  ediff    coef. to compute vertical eddy coef. (avt=ediff*mxl*sqrt(e) )
374!  ediss    coef. of the Kolmogoroff dissipation 
375!  ebb      coef. of the surface input of tke
376!  efave    coef. to applied to the tke diffusion ( avtke=efave*avm )
377!  emin     minimum value of tke (m^2/s^2)
378!  emin0    surface minimum value of tke (m^2/s^2)
379!  nitke    number of restart iterative loops
380!  ri_c     critic richardson number
381!  nmxl     flag on mixing length used
382!           = 0 bounded by the distance to surface and bottom
383!           = 1 bounded by the local vertical scale factor
384!           = 2 first vertical derivative of mixing length bounded by 1
385!  npdl     flag on prandtl number
386!           = 0 no vertical prandtl number (avt=avm)
387!           = 1 prandtl number function of richarson number (avt=pdl*avm)
388!           = 2 same as = 1 but a shapiro filter is applied on pdl
389!  nave     =  horizontal averaged (=1) or not (=0) of avt  (default =1)
390!  navb     = 0 cst background avt0, avm0 / =1 profile used on avtb
391&namtke
392   ln_rstke = .false.
393   ediff =       0.1
394   ediss =       0.7
395   ebb   =      3.75
396   efave =        1.
397   emin  =     1.e-5
398   emin0 =     1.e-4
399   nitke =        50
400   nmxl  =         2
401   npdl  =         1
402   navb  =         0
403/
404!-----------------------------------------------------------------------
405!       namkpp   K-Profile Parameterization dependent vertical diffusion
406!                ( #ifdef "key_zdfkpp" )
407!-----------------------------------------------------------------------
408!  ln_kpprimix   shear instability mixing  (default T)
409!  difmiw        constant internal wave viscosity (m2/s)
410!  difsiw        constant internal wave diffusivity (m2/s)
411!  Riinfty       local Richardson Number limit for shear instability
412!  difri         maximum shear mixing at Rig = 0    (m2/s)
413!  bvsqcon       Brunt-Vaisala squared (1/s**2) for maximum convection
414!  difcon        maximum mixing in interior convection (m2/s)
415!  nave          = 0/1 flag for horizontal average on avt, avmu, avmv
416!  navb          = 0/1 flag for constant or profile background avt
417&namkpp
418   ln_kpprimix  = .true.
419   difmiw       =  1.e-04
420   difsiw       =  0.1e-04
421   Riinfty      =  0.8
422   difri        =  0.0050
423   bvsqcon      = -0.01e-07
424   difcon       =  1.
425   navb         =  0
426   nave         =  1
427/
428!-----------------------------------------------------------------------
429!       namddm   double diffusive mixing parameterization
430!-----------------------------------------------------------------------
431!   avts    maximum avs for dd mixing
432!   hsbfr   heat/salt buoyancy flux ratio
433&namddm
434      avts  = 1.e-4
435      hsbfr = 1.6
436/
437!-----------------------------------------------------------------------
438!       namlbc   lateral momentum boundary condition
439!-----------------------------------------------------------------------
440!  shlat   lateral boundary condition on velocity
441!                   shlat = 0 , free slip
442!               0 < shlat < 2 , partial slip
443!                   shlat = 2 , no slip
444!               2 < shlat     , strong slip
445&namlbc
446   shlat  =      0.
447/
448!-----------------------------------------------------------------------
449!       nambfr   bottom friction
450!-----------------------------------------------------------------------
451!  nbotfr  type of bottom friction
452!                  nbotfr = 0 , no slip
453!                  nbotfr = 1 , linear friction
454!                  nbotfr = 2 , nonlinear friction
455!                  nbotfr = 3 , free slip
456!  bfri1   bottom drag coefficient (linear case)
457!  bfri2   bottom drag coefficient (non linear case)
458!  bfeb2   bottom turbulent kinetic energy  (m^2/s^2)
459&nambfr
460   nbotfr =       2
461   bfri1  =   4.e-4
462   bfri2  =   1.e-3
463   bfeb2  =  2.5e-3
464/
465!-----------------------------------------------------------------------
466!       nambbc   bottom temperature boundary condition
467!-----------------------------------------------------------------------
468!  ngeo_flux  = 0 no geothermal heat flux
469!             = 1 constant geothermal heat flux
470!             = 2 variable geothermal heat flux (read in geothermal_heating.nc)
471!                 ( C A U T I O N : flux in mW/m2 in the NetCDF file )
472!  ngeo_flux_const   Constant value of geothermal heat flux (W/m2)
473&nambbc
474   ngeo_flux =  0
475   ngeo_flux_const = 86.4e-3
476/
477!-----------------------------------------------------------------------
478!       namqsr   penetrative solar radiation
479!-----------------------------------------------------------------------
480!  ln_traqsr : penetrative solar radiation (T) or not (F)     (Default=T)
481!  rabs       fraction of qsr associated with xsi1
482!  xsi1       first depth of extinction
483!  xsi2       second depth of extinction
484&namqsr
485   ln_traqsr = .true.
486   rabs     =   0.58
487   xsi1     =   0.35
488   xsi2     =   23.0
489/
490!-----------------------------------------------------------------------
491!       namtdp   tracer newtonian damping ('key_tradmp')
492!-----------------------------------------------------------------------
493!  ndmp    type of damping in temperature and salinity
494!          (='latitude', damping poleward of 'ndmp' degrees and function
495!             of the distance-to-coast. Red and Med Seas as ndmp=-1)
496!          (=-1 damping only in Med and Red Seas)
497!  ndmpf   =1 create a damping.coeff NetCDF file (the 3D damping array)
498!  nmldmp  type of damping in the mixed layer
499!          (=0 damping throughout the water column)
500!     (=1 no damping in the mixed layer defined by avt >5cm2/s )
501!     (=2 no damping in the mixed layer defined rho<rho(surf)+.01 )
502!  sdmp    surface time scale for internal damping (days)
503!  bdmp    bottom time scale for internal damping (days)
504!  hdmp    depth of transition between sdmp and bdmp (meters)
505&namtdp
506   ndmp   =   -1
507   ndmpf  =    1
508   nmldmp =    1
509   sdmp   =  50.
510   bdmp   = 360.
511   hdmp   = 800.
512/
513!-----------------------------------------------------------------------
514!       nameos   ocean physical parameters
515!-----------------------------------------------------------------------
516!  neos    type of equation of state and Brunt-Vaisala frequency
517!          = 0, UNESCO (formulation of Jackett and McDougall (1994)
518!                                         and of McDougall (1987) )
519!          = 1, linear: rho(T)   = rau0 * ( 1.028 - ralpha * T )
520!          = 2, linear: rho(T,S) = rau0 * ( rbeta * S - ralpha * T )
521!                               with rau0=1020 set in parcst routine
522!  ralpha  thermal expension coefficient (linear equation of state)
523!  rbeta   saline  expension coefficient (linear equation of state)
524&nameos
525   neos   =      2
526   ralpha =  2.e-4
527   rbeta  =  7.7e-4
528/
529!-----------------------------------------------------------------------
530!       namsol   elliptic solver / island / free surface
531!-----------------------------------------------------------------------
532!  nsolv     elliptic solver (=1 preconditioned conjugate gradient: pcg)
533!                            (=2 successive-over-relaxation: sor)
534!                            (=3 FETI: fet, all require "key_feti" defined)
535!                            (=4 sor with extra outer halo)
536!  nsol_arp  absolute/relative (0/1) precision convergence test
537!  nmin      minimum of iterations for the SOR solver
538!  nmax      maximum of iterations for the SOR solver
539!  nmod      frequency of test for the SOR solver
540!  eps       absolute precision of the solver
541!  resmax    absolute precision for the SOR solver
542!  sor       optimal coefficient for SOR solver
543!  epsisl    absolute precision on stream function solver
544!  nmisl     maximum pcg iterations for island
545!  rnu       strength of the additional force used in free surface b.c.
546&namsol
547   nsolv     =      2
548   nsol_arp  =      0
549   nmin      =    210
550   nmax      =    800
551   nmod      =     10
552   eps       =  1.E-6
553   resmax    = 1.E-10
554   sor       =   1.96
555   epsisl    = 1.e-10
556   nmisl     =   4000
557   rnu       =     1.
558/
559!=======================================================================
560!   Diagnostics namelists
561!       namtrd    dynamics and/or tracer trends
562!       namgap    level mean model-data gap
563!       namznl    zonal mean heat & freshwater fluxes computation
564!       namspr    surface pressure in rigid-lid
565!=======================================================================
566!-----------------------------------------------------------------------
567!       namtrd    diagnostics on dynamics and/or tracer trends
568!                         ('key_trdyn' and/or 'key_trdtra')
569!                 or mixed-layer trends ('key_trdmld')
570!-----------------------------------------------------------------------
571!  ntrd              time step frequency dynamics and tracers trends
572!  nctls             control surface type in mixed-layer trends (0,1 or n<jpk)
573!  ln_trdmld_restart restart for ML diagnostics
574!  ucf               unit conversion factor (=1 -> /seconds | =86400. -> /day)
575!  ln_trdmld_instant flag to diagnose trends of instantantaneous or mean ML T/S
576&namtrd
577   ntrd  = 365
578   nctls =   0
579   ln_trdmld_restart = .false.
580   ucf   =  1.
581   ln_trdmld_instant = .false.
582/
583!-----------------------------------------------------------------------
584!       namgap    level mean model-data gap ('key_diagap')
585!-----------------------------------------------------------------------
586!  ngap    time-step frequency of model-data gap computation
587!  nprg    time-step frequency of gap print in model output
588&namgap
589   ngap =  15
590   nprg =  10
591/
592!-----------------------------------------------------------------------
593!       namznl    zonal mean heat & freshwater fluxes computation
594!                 (#ifdef "key_diaznl")
595!-----------------------------------------------------------------------
596!  nfznl   time-step frequency of zonal mean fluxes computation
597&namznl
598   nfznl =  15
599/
600!-----------------------------------------------------------------------
601!       namspr  surface pressure diagnostic
602!-----------------------------------------------------------------------
603!  nmaxp   maximum of iterations for the solver
604!  epsp    absolute precision of the solver
605!  niterp  number of iteration done by the solver
606&namspr
607   nmaxp   =   1000
608   epsp    =  1.e-3
609   niterp  =    400
610/
611!-----------------------------------------------------------------------
612!       namcpl    coupled ocean/atmosphere model  (#ifdef "key_coupled")
613!-----------------------------------------------------------------------
614!  nexco   coupling frequency in time steps
615!  cchan   coupling technique 'PIPE' or 'CLIM'
616&namcpl
617   nexco            =         24
618   cchan            =     'PIPE'
619   nmodcpl          =          2
620   cplmodnam        =   'opa.xx'
621   cploasis         =    'Oasis'
622   nfldo2c          =          2
623   nflxc2o          =          6
624   ntauc2o          =          4
625   cpl_writ(1)      = 'SOSSTSST'
626   cpl_f_writ(1)    =   'ocesst'
627   cpl_writ(2)      = 'SOICECOV'
628   cpl_f_writ(2)    =   'oceice'
629   cpl_readflx(1)   = 'SONSFLDO'
630   cpl_f_readflx(1) =   'oceflx'
631   cpl_readflx(2)   = 'SOSHFLDO'
632   cpl_f_readflx(2) =   'oceflx'
633   cpl_readflx(3)   = 'SOTOPRSU'
634   cpl_f_readflx(3) =   'oceflx'
635   cpl_readflx(4)   = 'SOTFSHSU'
636   cpl_f_readflx(4) =   'oceflx'
637   cpl_readflx(5)   = 'SORUNCOA'
638   cpl_f_readflx(5) =   'oceflx'
639   cpl_readflx(6)   = 'SORIVFLU'
640   cpl_f_readflx(6) =   'oceflx'
641   cpl_readtau(1)   = 'SOZOTAUX'
642   cpl_f_readtau(1) =   'ocetau'
643   cpl_readtau(2)   = 'SOZOTAU2'
644   cpl_f_readtau(2) =   'ocetau'
645   cpl_readtau(3)   = 'SOMETAUY'
646   cpl_f_readtau(3) =   'ocetau'
647   cpl_readtau(4)   = 'SOMETAU2'
648   cpl_f_readtau(4) =   'ocetau'
649/
650!-----------------------------------------------------------------------
651!       namobc    open boundaries parameters (#ifdef key_obc)
652!-----------------------------------------------------------------------
653!  nobc_dta   = 0 the obc data are equal to the initial state
654!             = 1 the obc data are read in 'obc   .dta' files
655!  rdpeob  time relaxation (days) for the east open boundary
656!  rdpwob  time relaxation (days) for the west open boundary
657!  rdpnob  time relaxation (days) for the north open boundary
658!  rdpsob  time relaxation (days) for the south open boundary
659!  zbsic1  barotropic stream function on isolated coastline 1
660!  zbsic2  barotropic stream function on isolated coastline 2
661!  zbsic3  barotropic stream function on isolated coastline 3
662!  ln_obc_clim  climatological obc data files (default T)
663!  ln_vol_cst   total volume conserved
664&namobc
665    nobc_dta =    0
666    rdpein   =    1.
667    rdpwin   =    1.
668    rdpnin   =   30.
669    rdpsin   =    1.
670    rdpeob   = 1500.
671    rdpwob   =   15.
672    rdpnob   =  150.
673    rdpsob   =   15.
674    zbsic1   =  140.e+6
675    zbsic2   =    1.e+6
676    zbsic3   =    0.
677    ln_obc_clim = .true.
678    ln_vol_cst  = .false.
679/
680!-----------------------------------------------------------------------
681!       namflo    float parameters (#ifdef key_float)
682!-----------------------------------------------------------------------
683!  ln_rstflo   boolean term for float restart (true or false)
684!  nwritefl   frequency of float output file
685!  nstockfl   frequency of float restart file
686!  ln_argo    Argo type floats (stay at the surface each 10 days)
687!  ln_flork4  = T trajectories computed with a 4th order Runge-Kutta
688!             = F  (default)   computed with Blanke' scheme
689&namflo
690    ln_rstflo = .false.
691    nwritefl  =      75
692    nstockfl  =    5475
693    ln_argo   = .false.
694    ln_flork4 = .false.
695/
Note: See TracBrowser for help on using the repository browser.