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

Last change on this file since 631 was 631, checked in by opalod, 17 years ago

nemo_v2_update_007 : CT : add the logical namelist ln_dimgnnn to be able to choose (in DIMG) between:

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