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.
Changeset 7189 for branches/2016/dev_r6409_SIMPLIF_2_usrdef/NEMOGCM/TOOLS/DOMAINcfg/src/nemogcm.f90 – NEMO

Ignore:
Timestamp:
2016-11-04T08:17:27+01:00 (7 years ago)
Author:
gm
Message:

#1692 - branch SIMPLIF_2_usrdef: e3.=dk[dep.] TOOLS update + domzgr style

File:
1 edited

Legend:

Unmodified
Added
Removed
  • branches/2016/dev_r6409_SIMPLIF_2_usrdef/NEMOGCM/TOOLS/DOMAINcfg/src/nemogcm.f90

    r6951 r7189  
    8989      !!---------------------------------------------------------------------- 
    9090      ! 
    91  
    92  
    93  
    94  
    9591      !                            !-----------------------! 
    9692      CALL nemo_init               !==  Initialisations  ==! 
    9793      !                            !-----------------------! 
    9894 
    99  
    100  
    101  
    10295      ! check that all process are still there... If some process have an error, 
    10396      ! they will never enter in step and other processes will wait until the end of the cpu time! 
     
    115108      ENDIF 
    116109      ! 
    117  
    118  
    119  
    120  
    121  
    122  
    123  
    124110      IF( nn_timing == 1 )   CALL timing_finalize 
    125111      ! 
    126112      CALL nemo_closefile 
    127113      ! 
    128  
    129114      CALL xios_finalize                  ! end mpp communications with xios 
    130  
    131  
    132  
    133115      ! 
    134116   END SUBROUTINE nemo_gcm 
     
    149131         &             nn_isplt, nn_jsplt, nn_jctls, nn_jctle,   & 
    150132         &             nn_bench, nn_timing, nn_diacfl 
    151       NAMELIST/namcfg/ cp_cfg, cp_cfz, jp_cfg, jpidta, jpjdta, jpkdta, jpiglo, jpjglo, & 
     133      NAMELIST/namcfg/ ln_e2_dep,                                & 
     134         &             cp_cfg, cp_cfz, jp_cfg, jpidta, jpjdta, jpkdta, jpiglo, jpjglo, & 
    152135         &             jpizoom, jpjzoom, jperio, ln_use_jattr 
    153136      !!---------------------------------------------------------------------- 
     
    305288         WRITE(numout,*) '~~~~~~~ ' 
    306289         WRITE(numout,*) '   Namelist namcfg' 
     290         WRITE(numout,*) '      vertical scale factors =T: e3.=dk[depth]       ln_e2_dep = ', ln_e2_dep 
     291         WRITE(numout,*) '                             =F: old definition                 ' 
    307292         WRITE(numout,*) '      configuration name                               cp_cfg  = ', TRIM(cp_cfg) 
    308293         WRITE(numout,*) '      configuration zoom name                          cp_cfz  = ', TRIM(cp_cfz) 
     
    317302         WRITE(numout,*) '      lateral cond. type (between 0 and 6)             jperio  = ', jperio    
    318303         WRITE(numout,*) '      use file attribute if exists as i/p j-start ln_use_jattr = ', ln_use_jattr 
     304         ! 
     305         IF(.NOT.ln_e2_dep ) THEN 
     306            WRITE(numout,cform_war) 
     307            WRITE(numout,*) 
     308            WRITE(numout,*) '      ===>>>>    Obsolescent definition of e3 scale factors is used' 
     309            WRITE(numout,*) 
     310         ENDIF 
    319311      ENDIF 
    320312      !                             ! Parameter control 
Note: See TracChangeset for help on using the changeset viewer.