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

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

nemo_v1_update_046 : CT : - light modifications related to the way to make SST/SSS damping

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