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

Last change on this file since 889 was 889, checked in by ctlod, 16 years ago

merge dev_001_SBC branche with the trunk to include the New Surface Module package, see ticket: #113

  • Property svn:eol-style set to native
  • Property svn:keywords set to Author Date Id Revision
File size: 36.8 KB
RevLine 
[102]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)
[180]22!  ninist     initial state output flag (0/1)
[102]23!  nstock     frequency of restart file
24!  nwrite     frequency of OUTPUT file
[631]25!  ln_dimgnnn (F/T) 1 DIMG file - (for all proc/per proc)
[102]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
[124]38   nleapy     =      30
[180]39   ninist     =       0
[102]40   nstock     =    4320
41   nwrite     =      60
[631]42   ln_dimgnnn = .FALSE.
[102]43/
44!-----------------------------------------------------------------------
[517]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
[531]57!  nbit_cmp   bit comparison mode parameter (0/1): enables bit comparison between
58!             single and multiple processor runs.
[517]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
[531]69   nbit_cmp =     0
[517]70/
71!-----------------------------------------------------------------------
[300]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!-----------------------------------------------------------------------
[638]82!       nam_mpp_dyndist      Massively Parallel Distribution
83!              #ifdef ( key_agrif && key_mpp_dyndist )
84!-----------------------------------------------------------------------
85!  jpni   number of processors following i
86!  jpnj   number of processors following j
87!  jpnij  number of local domains
88&nam_mpp_dyndist
89   jpni  = 1
90   jpnj  = 1
91   jpnij = 1
92/
93!-----------------------------------------------------------------------
[470]94!       nam_zgr       vertical coordinate
95!-----------------------------------------------------------------------
96!  ln_zco     z-coordinate - full steps      (T/F)
97!  ln_zps     z-coordinate - partial steps   (T/F)
98!  ln_sco     s- or hybrid z-s-coordinate    (T/F)
99&nam_zgr
100   ln_zco   =  .true.
101   ln_zps   =  .false.
102   ln_sco   =  .false.
103/
104!-----------------------------------------------------------------------
105!       nam_zgr_sco   s-coordinate or hybrid z-s-coordinate
106!-----------------------------------------------------------------------
107!  sbot_min   minimum depth of s-bottom surface (>0) (m)
108!  sbot_max   maximum depth of s-bottom surface (= ocean depth) (>0) (m)
109!  theta      surface control parameter (0<=theta<=20)
110!  thetb      bottom control parameter  (0<=thetb<= 1)
111!  r_max      maximum cut-off r-value allowed (0<r_max<1)
112&nam_zgr_sco
113   sbot_min =  300.
114   sbot_max = 5250.
115   theta    =    6.0
116   thetb    =    0.75
117   r_max    =    0.15
118/
119!-----------------------------------------------------------------------
[102]120!       nam_traadv   advection scheme for tracer (option not control by CPP keys)
121!-----------------------------------------------------------------------
122!  ln_traadv_cen2     2nd order centered scheme    (default T)
123!  ln_traadv_tvd      TVD scheme                   (default F)
124!  ln_traadv_muscl    MUSCL scheme                 (default F)
125!  ln_traadv_muscl2   MUSCL2 scheme                (default F)
[512]126!  ln_traadv_ubs      UBS scheme                   (default F)
[638]127!  ln_traadv_qck      QUICKEST scheme              (default F)
[102]128&nam_traadv
[435]129   ln_traadv_cen2   =  .false.
130   ln_traadv_tvd    =  .true.
[102]131   ln_traadv_muscl  =  .false.
132   ln_traadv_muscl2 =  .false.
[512]133   ln_traadv_ubs    =  .false.
[638]134   ln_traadv_qck    =  .false.
[102]135/
136!-----------------------------------------------------------------------
137!       nam_traldf   lateral diffusion scheme for tracer (option not control by CPP keys)
138!-----------------------------------------------------------------------
139!  Type of the operator :
140!     ln_traldf_lap    laplacian operator          (default T)
141!     ln_traldf_bilap  bilaplacian operator        (default F)
142!  Direction of action  :
143!     ln_traldf_level  iso-level                   (default F)
144!     ln_traldf_hor    horizontal (geopotential)   (default F)^**
145!     ln_traldf_iso    iso-neutral                 (default T)^*
146!  Coefficient
147!     aht0    horizontal eddy diffusivity for tracers (m2/s)
148!     ahtb0   background eddy diffusivity for isopycnal diffusion (m2/s)
149!     aeiv0   eddy induced velocity coefficient (m2/s)
150! ^* require key_ldfslp to compute the direction of the lateral diffusion
151! ^** require key_ldfslp in s-coordinate
152&nam_traldf
153   ln_traldf_lap    =  .true.
154   ln_traldf_bilap  =  .false.
155   ln_traldf_level  =  .false.
156   ln_traldf_hor    =  .false.
157   ln_traldf_iso    =  .true.
158   aht0    =  1000.
159   ahtb0   =     0.
160   aeiv0   =  1000.
161/
162!-----------------------------------------------------------------------
163!       nam_dynldf   lateral diffusion on momentum
164!-----------------------------------------------------------------------
165!  Type of the operator :
166!     ln_dynldf_lap    laplacian operator          (default T)
167!     ln_dynldf_bilap  bilaplacian operator        (default F)
168!  Direction of action  :
169!     ln_dynldf_level  iso-level                   (default F)
170!     ln_dynldf_hor    horizontal (geopotential)   (default F)^**
171!     ln_dynldf_iso    iso-neutral                 (default T)^*
172!  Coefficient
173!  ahm0    horizontal eddy viscosity for the dynamics (m2/s)
174!  ahmb0   background eddy viscosity for isopycnal diffusion (m2/s)
175&nam_dynldf
176   ln_dynldf_lap    =  .true.
177   ln_dynldf_bilap  =  .false.
178   ln_dynldf_level  =  .false.
179   ln_dynldf_hor    =  .true.
180   ln_dynldf_iso    =  .false.
181   ahm0    = 100000.
182   ahmb0   =      0.
183/
184!-----------------------------------------------------------------------
185!       namflg   algorithm flags (algorithm not control by CPP keys)
186!-----------------------------------------------------------------------
187!  ln_dynhpg_imp   hydrostatic pressure gradient: semi-implicit time scheme  (T)
188!                                                  centered      time scheme  (F)
[545]189!   nn_dynhpg_rst  add dynhpg implicit variables in restart ot not (1/0)
[102]190&namflg
191   ln_dynhpg_imp   =  .false.
[545]192   nn_dynhpg_rst   =  0
[102]193/
194!-----------------------------------------------------------------------
[470]195!       nam_dynhpg   Hydrostatic pressure gradient option
196!-----------------------------------------------------------------------
197!  type of pressure gradient scheme (choose one only!)
198!     ln_hpg_zco    z-coordinate - full steps                   (default T)
199!     ln_hpg_zps    z-coordinate - partial steps (interpolation)
200!     ln_hpg_sco    s-coordinate (standard jacobian formulation)
201!     ln_hpg_hel    s-coordinate (helsinki modification)
202!     ln_hpg_wdj    s-coordinate (weighted density jacobian)
203!     ln_hpg_djc    s-coordinate (Density Jacobian with Cubic polynomial)
204!     ln_hpg_rot    s-coordinate (ROTated axes scheme)
205!  parameters
206!    gamm          weighting coefficient (wdj scheme)
207&nam_dynhpg
208   ln_hpg_zco = .true.
209   ln_hpg_zps = .false.
210   ln_hpg_sco = .false.
211   ln_hpg_hel = .false.
212   ln_hpg_wdj = .false.
213   ln_hpg_djc = .false.
214   ln_hpg_rot = .false.
215   gamm       = 0.e0
216/
217!-----------------------------------------------------------------------
[643]218!       nam_dynadv   option of physics/algorithm (not control by CPP keys)
219!-----------------------------------------------------------------------
220!  ln_dynadv_vec      vector form flag
221!  ln_dynadv_cen2     flux form - 2nd order centered scheme    (default T)
222!  ln_dynadv_ubs      flux form - 3rd order UBS scheme         (default F)
223&nam_dynadv   
224   ln_dynadv_vec   = .TRUE.
225   ln_dynadv_cen2  = .FALSE.
226   ln_dynadv_ubs   = .FALSE.
227
228!-----------------------------------------------------------------------
[102]229!       nam_dynvor   option of physics/algorithm (not control by CPP keys)
230!-----------------------------------------------------------------------
231!  ln_dynvor_ens   vorticity trends: enstrophy conserving scheme (default T)
232!  ln_dynvor_ene      "         "  : energy conserving scheme    (default F)
233!  ln_dynvor_mix      "         "  : mixed scheme                (default F)
[122]234!  ln_dynvor_een      "         "  : energy & enstrophy scheme   (default F)
[102]235&nam_dynvor
[435]236   ln_dynvor_ene = .TRUE.
237   ln_dynvor_ens = .FALSE.
[122]238   ln_dynvor_mix = .FALSE.
239   ln_dynvor_een = .FALSE.
[102]240/
241!-----------------------------------------------------------------------
[165]242!       namalb   albedo parameters
243!-----------------------------------------------------------------------
244!  cgren    correction of the snow or ice albedo to take into account
245!  albice   albedo of melting ice in the arctic and antarctic
246!  alphd    coefficients for linear interpolation used to compute albedo
247!           between two extremes values (Pyane, 1972)
248!  alphc     "                                         "
249!  alphdi    "                                         "
250&namalb
251   cgren    =      0.06
252   albice   =      0.5
253   alphd    =      0.80
254   alphc    =      0.65
255   alphdi   =      0.72
256/
257!-----------------------------------------------------------------------
[102]258!       namdom   space and time domain (bathymetry, mesh, timestep)
259!-----------------------------------------------------------------------
260!  ntopo      = 0/1 ,compute/read the bathymetry file
261!               (mbathy, nb of T-ocean levels)
262!  e3zps_min  the thickness of the partial step is set larger than the
263!  e3zps_rat     the minimum of e3zps_min and e3zps_rat * e3t
264!                (N.B. 0<e3zps_rat<1)
265!  nmsh       =1 create a mesh file (coordinates, scale factors, masks)
266!  nacc       the acceleration of convergence method
267!             = 0, no acceleration, rdt = rdttra
268!             = 1, acceleration used, rdt < rdttra(k)
269!  atfp       asselin time filter parameter
270!  rdt        time step for the dynamics (and tracer if nacc=0)
271!  rdtmin     minimum time step on tracers
272!  rdtmax     maximum time step on tracers
273!  rdth       depth variation of tracer time step
[435]274!  rdtbt      barotropic time step (for the time splitting algorithm)
[889]275!  nclosea    0 no closed sea
276!             1 closed sea (Black Sea, Caspian Sea, Great US Lakes...)
[102]277&namdom
278   ntopo     =     0
279   e3zps_min =     5.
280   e3zps_rat =     0.1
[435]281   nmsh      =     0
[102]282   nacc      =     0
283   atfp      =     0.1
284   rdt       =  7200.
285   rdtmin    =  7200.
286   rdtmax    =  7200.
287   rdth      =   800.
[364]288   rdtbt     =   120.
[102]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!-----------------------------------------------------------------------
[133]299!       namptr   Poleward Transport Diagnostic
300!-----------------------------------------------------------------------
301!  ln_diaptr  logical flag for Poleward transport computation
[423]302!  ln_subbas  logical flag for Atlantic/Pacific/Indian basins computation
303!             need input basins mask file named "subbasins.nc"
[133]304!  nf_ptr     Frequency of computation
305&namptr
306   ln_diaptr = .false.
[423]307   ln_subbas = .false.
[133]308   nf_ptr    =  15
309/
310!-----------------------------------------------------------------------
[102]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.
[470]333   avm0      = 1.2e-4
334   avt0      = 1.2e-5
335   avevd     =   100.
336   n_evdm    =     1
[102]337   ln_zdfexp =  .false.
[470]338   n_zdfexp  =     3
[102]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
[255]363&namric
[102]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.
[435]397   emin  =     1.e-5
[102]398   emin0 =     1.e-4
399   nitke =        50
400   nmxl  =         2
401   npdl  =         1
402   navb  =         0
403/
404!-----------------------------------------------------------------------
[255]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!-----------------------------------------------------------------------
[102]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
[441]506   ndmp   =   -1
[102]507   ndmpf  =    1
[441]508   nmldmp =    1
509   sdmp   =  50.
[102]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
[435]525   neos   =      2
[102]526   ralpha =  2.e-4
527   rbeta  =  7.7e-4
528/
529!-----------------------------------------------------------------------
530!       namsol   elliptic solver / island / free surface
531!-----------------------------------------------------------------------
[122]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!  nsol_arp  absolute/relative (0/1) precision convergence test
536!  nmin      minimum of iterations for the SOR solver
537!  nmax      maximum of iterations for the SOR solver
538!  nmod      frequency of test for the SOR solver
539!  eps       absolute precision of the solver
540!  resmax    absolute precision for the SOR solver
541!  sor       optimal coefficient for SOR solver
542!  epsisl    absolute precision on stream function solver
543!  nmisl     maximum pcg iterations for island
544!  rnu       strength of the additional force used in free surface b.c.
[102]545&namsol
[122]546   nsolv     =      2
547   nsol_arp  =      0
[436]548   nmin      =    210
[122]549   nmax      =    800
550   nmod      =     10
551   eps       =  1.E-6
[168]552   resmax    = 1.E-10
[122]553   sor       =   1.96
554   epsisl    = 1.e-10
555   nmisl     =   4000
556   rnu       =     1.
[102]557/
558!=======================================================================
559!   Diagnostics namelists
560!       namtrd    dynamics and/or tracer trends
561!       namgap    level mean model-data gap
562!       namznl    zonal mean heat & freshwater fluxes computation
563!       namspr    surface pressure in rigid-lid
564!=======================================================================
565!-----------------------------------------------------------------------
566!       namtrd    diagnostics on dynamics and/or tracer trends
[512]567!                         ('key_trdyn' and/or 'key_trdtra')
568!                 or mixed-layer trends ('key_trdmld')
[102]569!-----------------------------------------------------------------------
[512]570!  ntrd              time step frequency dynamics and tracers trends
571!  nctls             control surface type in mixed-layer trends (0,1 or n<jpk)
572!  ln_trdmld_restart restart for ML diagnostics
573!  ucf               unit conversion factor (=1 -> /seconds | =86400. -> /day)
574!  ln_trdmld_instant flag to diagnose trends of instantantaneous or mean ML T/S
[102]575&namtrd
576   ntrd  = 365
577   nctls =   0
[512]578   ln_trdmld_restart = .false.
579   ucf   =  1.
[523]580   ln_trdmld_instant = .false.
[102]581/
582!-----------------------------------------------------------------------
583!       namgap    level mean model-data gap ('key_diagap')
584!-----------------------------------------------------------------------
585!  ngap    time-step frequency of model-data gap computation
586!  nprg    time-step frequency of gap print in model output
587&namgap
588   ngap =  15
589   nprg =  10
590/
591!-----------------------------------------------------------------------
592!       namznl    zonal mean heat & freshwater fluxes computation
593!                 (#ifdef "key_diaznl")
594!-----------------------------------------------------------------------
595!  nfznl   time-step frequency of zonal mean fluxes computation
596&namznl
597   nfznl =  15
598/
599!-----------------------------------------------------------------------
600!       namspr  surface pressure diagnostic
601!-----------------------------------------------------------------------
602!  nmaxp   maximum of iterations for the solver
603!  epsp    absolute precision of the solver
604!  niterp  number of iteration done by the solver
605&namspr
606   nmaxp   =   1000
607   epsp    =  1.e-3
608   niterp  =    400
609/
610!-----------------------------------------------------------------------
611!       namobc    open boundaries parameters (#ifdef key_obc)
612!-----------------------------------------------------------------------
613!  nobc_dta   = 0 the obc data are equal to the initial state
614!             = 1 the obc data are read in 'obc   .dta' files
615!  rdpeob  time relaxation (days) for the east open boundary
616!  rdpwob  time relaxation (days) for the west open boundary
617!  rdpnob  time relaxation (days) for the north open boundary
618!  rdpsob  time relaxation (days) for the south open boundary
619!  zbsic1  barotropic stream function on isolated coastline 1
[369]620!  zbsic2  barotropic stream function on isolated coastline 2
[102]621!  zbsic3  barotropic stream function on isolated coastline 3
[369]622!  ln_obc_clim  climatological obc data files (default T)
623!  ln_vol_cst   total volume conserved
[102]624&namobc
625    nobc_dta =    0
626    rdpein   =    1.
627    rdpwin   =    1.
628    rdpnin   =   30.
629    rdpsin   =    1.
630    rdpeob   = 1500.
631    rdpwob   =   15.
632    rdpnob   =  150.
633    rdpsob   =   15.
634    zbsic1   =  140.e+6
635    zbsic2   =    1.e+6
636    zbsic3   =    0.
[369]637    ln_obc_clim = .true.
638    ln_vol_cst  = .false.
[102]639/
640!-----------------------------------------------------------------------
641!       namflo    float parameters (#ifdef key_float)
642!-----------------------------------------------------------------------
643!  ln_rstflo   boolean term for float restart (true or false)
644!  nwritefl   frequency of float output file
645!  nstockfl   frequency of float restart file
646!  ln_argo    Argo type floats (stay at the surface each 10 days)
647!  ln_flork4  = T trajectories computed with a 4th order Runge-Kutta
648!             = F  (default)   computed with Blanke' scheme
649&namflo
650    ln_rstflo = .false.
651    nwritefl  =      75
652    nstockfl  =    5475
653    ln_argo   = .false.
654    ln_flork4 = .false.
655/
[889]656!!======================================================================
657!!              Surface Boundary Condition namelists
658!!
659!!       namsbc    surface boundary condition
660!!       namsbc_ana    analytical         formulation of sbc
661!!       namsbc_flx    flux               formulation of sbc
662!!       namsbc_core   CORE bulk formulea formulation of sbc
663!!       namsbc_clio   CLIO bulk formulea formulation of sbc
664!!       namsbc_cpl    CouPLed            formulation of sbc
665!!       namsbc_ssr    sea surface restoring term (for T and/or S)
666!!======================================================================
[607]667!-----------------------------------------------------------------------
[889]668!       namsbc       Surface Boundary Condition (surface module)
[607]669!-----------------------------------------------------------------------
[889]670!  nn_fsbc          frequency of surface boundary condition computation
671!                   (also correspond to the frequency of sea-ice model call)
672!
673!  ln_ana        analytical formulation (fill namsbc_ana )
674!  ln_flx        flux formulation       (fill namsbc_flx ) (overwritten by key_sbc_flux     )
675!  ln_blk_clio   CLIO bulk formulation  (fill namsbc_core) (overwritten by key_sbc_bulk_clio)
676!  ln_blk_core   CORE bulk formulation  (fill namsbc_clio) (overwritten by key_sbc_bulk_core)
677!  ln_cpl        Coupled formulation    (fill namsbc_cpl ) (overwritten by key_sbc_coupled  )
678!
679!  nn_ice        =0 no ice boundary condition   ,
680!                =1 observed ice-cover          ,
681!                =2 ice-model ice-cover (overwritten by key_ice_lim)
682!
683!  ln_dm2dc     Daily mean to Diurnal Cycle short wave (qsr)
684!
685!  ln_ssr       Sea Surface restoring on SST and/or SSS (fill namsbc_ssr)
686!               (overwritten by key_dta_sst and/or key_dtasss)
687!
688!  nn_fwb       FreshWater Budget: =0 no control                              ,
689!                                  =1 annual global mean of emp set to zero   ,
690!                                  =2 global mean of emp set to zero at each nn_fsbc time step
691&namsbc
692   nn_fsbc     = 0
693   ln_ana      = .true.
694   ln_flx      = .false.
695   ln_blk_clio = .false.
696   ln_blk_core = .false.
697   ln_cpl      = .false.
698   nn_ice      = 0
699   ln_dm2dc    = .false.
700   ln_rnf      = .false.
701   ln_ssr      = .false.
702   nn_fwb      = 0
703/
704!-----------------------------------------------------------------------
705!       namsbc_rnf   runoffs namelist surface boundary condition
706!-----------------------------------------------------------------------
707!nn_runoff   =0 no, 1 runoff, 2 runoff+river mouth ups adv
708!rn_hrnf     runoffs, depth over which enhanced vertical mixing is used
709!rn_avt_rnf  runoffs, value of the additional vertical mixing coef. [m2/s]
710!cn_dir      Root directory for location of ssr files
711!sn_rnf      informations about the runoff file to be read
712!sn_cnf      informations about the runoff mouth file to be read
713!  THE ORDER OF THE FILES MATTER:
714!               !   file name        ! frequency (hours) ! variable   ! time interpolation !
715!               !                    !   (if <0  months) !   name     !     (logical)      !
716&namsbc_rnf
717   nn_runoff  = 0
718   rn_hrnf    = 0.e0
719   rn_avt_rnf = 1.e-3
720   cn_dir     = './'
721   sn_rnf     = 'runoff_1m_nomask.nc' ,      -12.        ,  'sorunoff',    .TRUE.   ,  1  ,  0     
722   sn_cnf     = 'runoff_1m_nomask.nc' ,        0.        ,  'socoefr' ,    .FALSE.  ,  1  ,  0             
723/
724!-----------------------------------------------------------------------
725!       namsbc_ana   analytical surface boundary condition
726!-----------------------------------------------------------------------
727!  nn_tau000   gently increase the stress over the first ntau_rst time-steps
728!  rn_utau0    uniform value used as default wind stress -u
729!  rn_vtau0    uniform value used as default wind stress -v
730!  rn_q0       uniform value used as default surface heat flux
731!  rn_qsr0     uniform value used as default solar radiation flux
732!  rn_emp0     uniform value used as default surface freswater budget (E-P)
733&namsbc_ana
734   nn_tau000  =   100
735   rn_utau0   =   0.1e0
736   rn_vtau0   =   0.e0
737   rn_q0      =   0.e0
738   rn_qsr0    =   0.e0
739   rn_emp0    =   0.e0
740/
741!-----------------------------------------------------------------------
742!       namsbc_flx   surface boundary condition : flux formulation (#ifdef "key_sbc_flux")
743!-----------------------------------------------------------------------
744!  cn_dir   directory in which the model is executed
745!
746!  THE ORDER OF THE FILES MATTER:
747!               !      file name     ! frequency (hours) ! variable ! time intepolation !  clim  ! starting !
748!               !                    !   (if <0  months) !   name   !    (logical)      !  (0/1) !  record  !
749&namsbc_flx
750   cn_dir       = './'
751   sn_utau      =      'utau.nc'     ,        24.        ,  'utau'  ,     .FALSE.       ,    0   ,     0
752   sn_vtau      =      'vtau.nc'     ,        24.        ,  'vtau'  ,     .FALSE.       ,    0   ,     0
753   sn_qtot      =      'qtot.nc'     ,        24.        ,  'qtot'  ,     .FALSE.       ,    0   ,     0
754   sn_qsr       =      'qsr.nc'      ,        24.        ,  'qsr'   ,     .FALSE.       ,    0   ,     0
755   sn_emp       =      'emp.nc'      ,        24.        ,  'emp'   ,     .FALSE.       ,    0   ,     0
756
757/     
758!-----------------------------------------------------------------------
759!       namsbc_clio  CLIO bulk formulea
760!-----------------------------------------------------------------------
761!  cn_dir   directory in which the model is executed
762!
763!  THE ORDER OF THE FILES MATTER:
764!               !   file name        ! frequency (hours) ! variable   ! time intepolation !  clim  ! starting !
765!               !                    !   (if <0  months) !   name     !    (logical)      !  (0/1) !  record  !
766&namsbc_clio
767   cn_dir       = './'
768   sn_utau      =    'taux_1m'    ,      -12.         ,  'sozotaux',    .FALSE.        ,    1   ,    0   
769   sn_vtau      =    'tauy_1m'    ,      -12.         ,  'sometauy',    .FALSE.        ,    1   ,    0   
770   sn_wndm      =    'flx'        ,      -12.         ,  'socliowi',    .FALSE.        ,    1   ,    0     
771   sn_tair      =    'flx'        ,      -12.         ,  'socliot1',    .FALSE.        ,    1   ,    0     
772   sn_humi      =    'flx'        ,      -12.         ,  'socliohu',    .FALSE.        ,    1   ,    0   
773   sn_ccov      =    'flx'        ,      -12.         ,  'socliocl',    .FALSE.        ,    1   ,    0     
774   sn_prec      =    'flx'        ,      -12.         ,  'socliopl',    .FALSE.        ,    1   ,    0       
775/
776!-----------------------------------------------------------------------
777!       namsbc_core  CORE bulk formulea
778!-----------------------------------------------------------------------
779!  cn_dir         directory in which the model is executed
780!  ln_2m          logical flag to use air temp. and hum referenced at 2m instead 10m
781!  alpha_precip   multiplication factor for precipitation (total & snow)
782!
783!  THE ORDER OF THE FILES MATTER:
784!               !   file name        ! frequency (hours) ! variable   ! time intepolation !  clim  ! starting !
785!               !                    !   (if <0  months) !   name     !    (logical)      !  (0/1) !  record  !
786&namsbc_core
787   cn_dir       = './'
[633]788   ln_2m        = .FALSE.
789   alpha_precip = 1.
[889]790   sn_wndi      =    'u10'        ,       24.         ,  'U_10_MOD',    .FALSE.        ,    1   ,    0   
791   sn_wndj      =    'v10'        ,       24.         ,  'V_10_MOD',    .FALSE.        ,    1   ,    0   
792   sn_qsr       =    'rad'        ,       24.         ,  'SWDN_MOD',    .FALSE.        ,    1   ,    0     
793   sn_qlw       =    'rad'        ,       24.         ,  'LWDN_MOD',    .FALSE.        ,    1   ,    0     
794   sn_tair      =    't10'        ,       24.         ,  'T_10_MOD',    .FALSE.        ,    1   ,    0     
795   sn_humi      =    'q10'        ,       24.         ,  'Q_10_MOD',    .FALSE.        ,    1   ,    0   
796   sn_prec      =    'precip'     ,      -12.         ,  'RAIN'    ,    .FALSE.        ,    1   ,    0     
797   sn_snow      =    'precip'     ,      -12.         ,  'SNOW'    ,    .FALSE.        ,    1   ,    0       
[607]798/
[889]799!-----------------------------------------------------------------------
800!       namsbc_cpl    coupled ocean/atmosphere model  (#ifdef "key_coupled")
801!-----------------------------------------------------------------------
802&namsbc_cpl
803/
804!-----------------------------------------------------------------------
805!       namsbc_ssr   surface boundary condition : sea surface restoring
806!-----------------------------------------------------------------------
807!  nn_sstr   =0/1   add a retroaction term in the surface heat flux
808!  nn_sssr   =O/1/2 add a damping term in the surface freshwater flux
809!             (=1, salt flux, concentration/dillution emps only)
810!             (=2, volume flux, both emp and emps are updated)
811!  dqdt       magnitude of the retroaction on temperature [W/m2/K]
812!  deds       magnitude of the damping on salinity [mm/day]
813!  THE ORDER OF THE FILES MATTER:
814!               !   file name     ! frequency (hours) ! variable ! time intepolation !  clim  ! starting !
815!               !                 !   (if <0  months) !   name   !    (logical)      !  (0/1) !  record  !
816&namsbc_ssr
817   nn_sstr      = 0
818   nn_sssr      = 0
819   dqdt         = -40.
820   deds         =  27.7
821   sn_sst       =  'sst_data.nc'  ,         24.       ,  'sst'   ,     .FALSE.       ,    0   ,     0
822   sn_sss       =  'sss_data.nc'  ,        -12.       ,  'sss'   ,     .TRUE.        ,    0   ,     0
823/     
Note: See TracBrowser for help on using the repository browser.