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

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

nemo_v1_update_078:RB: finalization of IOM

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