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

Last change on this file since 258 was 258, checked in by opalod, 19 years ago

nemo_v1_update_004 : CT : Integration of the control print option for debugging work

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