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 9135 for branches/2017 – NEMO

Changeset 9135 for branches/2017


Ignore:
Timestamp:
2017-12-19T16:44:50+01:00 (6 years ago)
Author:
flavoni
Message:

fix input/ouput flag of coordinates in usrdef routines

Location:
branches/2017/dev_merge_2017/NEMOGCM/CONFIG/TEST_CASES
Files:
6 edited

Legend:

Unmodified
Added
Removed
  • branches/2017/dev_merge_2017/NEMOGCM/CONFIG/TEST_CASES/ISOMIP/EXP00/namelist_cfg

    r9089 r9135  
    66!----------------------------------------------------------------------- 
    77   ln_zps      = .true.    ! z-partial-step coordinate 
     8   ln_zco      = .false.   ! z-full-step coordinate 
     9   ln_sco      = .false.   ! s-coordinate 
    810   rn_e1deg    =   0.3     !  zonal      grid-spacing (degrees) 
    911   rn_e2deg    =   0.1     !  meridional grid-spacing (degrees) 
  • branches/2017/dev_merge_2017/NEMOGCM/CONFIG/TEST_CASES/ISOMIP/MY_SRC/usrdef_zgr.F90

    r9125 r9135  
    1616   !!--------------------------------------------------------------------- 
    1717   USE oce            ! ocean variables 
    18    USE dom_oce ,  ONLY: ln_zco, ln_zps, ln_sco          ! ocean space and time domain 
    1918   USE dom_oce ,  ONLY: mj0   , mj1   , nimpp , njmpp   ! ocean space and time domain 
    2019   USE dom_oce ,  ONLY: glamt , gphit                   ! ocean space and time domain 
     
    5251      !! 
    5352      !!---------------------------------------------------------------------- 
    54       LOGICAL                   , INTENT(out) ::   ld_zco, ld_zps, ld_sco      ! vertical coordinate flags 
    55       LOGICAL                   , INTENT(out) ::   ld_isfcav                   ! under iceshelf cavity flag 
    56       REAL(wp), DIMENSION(:)    , INTENT(out) ::   pdept_1d, pdepw_1d          ! 1D grid-point depth     [m] 
    57       REAL(wp), DIMENSION(:)    , INTENT(out) ::   pe3t_1d , pe3w_1d           ! 1D grid-point depth     [m] 
    58       REAL(wp), DIMENSION(:,:,:), INTENT(out) ::   pdept, pdepw                ! grid-point depth        [m] 
    59       REAL(wp), DIMENSION(:,:,:), INTENT(out) ::   pe3t , pe3u , pe3v , pe3f   ! vertical scale factors  [m] 
    60       REAL(wp), DIMENSION(:,:,:), INTENT(out) ::   pe3w , pe3uw, pe3vw         ! i-scale factors  
    61       INTEGER , DIMENSION(:,:)  , INTENT(out) ::   k_top, k_bot                ! first & last ocean level 
     53      LOGICAL                   , INTENT(in   ) ::   ld_zco, ld_zps, ld_sco      ! vertical coordinate flags ( read in namusr_def ) 
     54      LOGICAL                   , INTENT(  out) ::   ld_isfcav                   ! under iceshelf cavity flag 
     55      REAL(wp), DIMENSION(:)    , INTENT(  out) ::   pdept_1d, pdepw_1d          ! 1D grid-point depth     [m] 
     56      REAL(wp), DIMENSION(:)    , INTENT(  out) ::   pe3t_1d , pe3w_1d           ! 1D grid-point depth     [m] 
     57      REAL(wp), DIMENSION(:,:,:), INTENT(  out) ::   pdept, pdepw                ! grid-point depth        [m] 
     58      REAL(wp), DIMENSION(:,:,:), INTENT(  out) ::   pe3t , pe3u , pe3v , pe3f   ! vertical scale factors  [m] 
     59      REAL(wp), DIMENSION(:,:,:), INTENT(  out) ::   pe3w , pe3uw, pe3vw         ! i-scale factors  
     60      INTEGER , DIMENSION(:,:)  , INTENT(  out) ::   k_top, k_bot                ! first & last ocean level 
    6261      ! 
    6362      INTEGER  ::   ji , jj, jk       ! dummy indices 
     
    8079      ! --------------------------- 
    8180      ! set in usrdef_nam.F90 by reading the namusr_def namelist except for ISF 
    82       ln_zco    = .FALSE.      ! z-partial-step coordinate 
    83       ln_zps    = .TRUE.       ! z-partial-step coordinate 
    84       ln_sco    = .FALSE.      ! s-coordinate 
    8581      ld_isfcav = .TRUE.       ! ISF Ice Shelves Flag 
    8682      ! 
     
    109105      !                       !==  top masked level bathymetry  ==!  (all coordinates) 
    110106      ! 
    111       IF ( ln_zps ) THEN      !==  zps-coordinate  ==!   (partial bottom-steps) 
     107      IF ( ld_zps ) THEN      !==  zps-coordinate  ==!   (partial bottom-steps) 
    112108         ! 
    113109         ze3min = 0.1_wp * rn_e3 
  • branches/2017/dev_merge_2017/NEMOGCM/CONFIG/TEST_CASES/LOCK_EXCHANGE/MY_SRC/usrdef_zgr.F90

    r9125 r9135  
    1515   !!--------------------------------------------------------------------- 
    1616   USE oce            ! ocean variables 
    17    USE dom_oce ,  ONLY: ln_zco, ln_zps, ln_sco   ! ocean space and time domain 
    1817   USE usrdef_nam     ! User defined : namelist variables 
    1918   ! 
     
    6766      ! 
    6867      ! 
    69       ! type of vertical coordinate 
     68      ! type of vertical coordinate   ==>>>   here LOCK EXCHANGE : flat bottom always  
    7069      ! --------------------------- 
    71       ! set in usrdef_nam.F90 by reading the namusr_def namelist only ln_zco 
    72       ln_zco    = .TRUE.       ! z-partial-step coordinate 
    73       ln_zps    = .FALSE.      ! z-partial-step coordinate 
    74       ln_sco    = .FALSE.      ! s-coordinate 
     70      ld_zco    = .TRUE.       ! z-partial-step coordinate 
     71      ld_zps    = .FALSE.      ! z-partial-step coordinate 
     72      ld_sco    = .FALSE.      ! s-coordinate 
    7573      ld_isfcav = .FALSE.      ! ISF Ice Shelves Flag 
    7674      ! 
  • branches/2017/dev_merge_2017/NEMOGCM/CONFIG/TEST_CASES/OVERFLOW/MY_SRC/usrdef_zgr.F90

    r9125 r9135  
    1515   !!--------------------------------------------------------------------- 
    1616   USE oce            ! ocean variables 
    17    USE dom_oce ,  ONLY: ln_zco, ln_zps, ln_sco   ! ocean space and time domain 
    1817   USE dom_oce ,  ONLY: mi0, mi1, nimpp, njmpp   ! ocean space and time domain 
    1918   USE dom_oce ,  ONLY: glamt                    ! ocean space and time domain 
     
    5150      !! 
    5251      !!---------------------------------------------------------------------- 
    53       LOGICAL                   , INTENT(out) ::   ld_zco, ld_zps, ld_sco      ! vertical coordinate flags 
    54       LOGICAL                   , INTENT(out) ::   ld_isfcav                   ! under iceshelf cavity flag 
    55       REAL(wp), DIMENSION(:)    , INTENT(out) ::   pdept_1d, pdepw_1d          ! 1D grid-point depth     [m] 
    56       REAL(wp), DIMENSION(:)    , INTENT(out) ::   pe3t_1d , pe3w_1d           ! 1D grid-point depth     [m] 
    57       REAL(wp), DIMENSION(:,:,:), INTENT(out) ::   pdept, pdepw                ! grid-point depth        [m] 
    58       REAL(wp), DIMENSION(:,:,:), INTENT(out) ::   pe3t , pe3u , pe3v , pe3f   ! vertical scale factors  [m] 
    59       REAL(wp), DIMENSION(:,:,:), INTENT(out) ::   pe3w , pe3uw, pe3vw         ! i-scale factors  
    60       INTEGER , DIMENSION(:,:)  , INTENT(out) ::   k_top, k_bot                ! first & last ocean level 
     52      LOGICAL                   , INTENT(in   ) ::   ld_zco, ld_zps, ld_sco      ! vertical coordinate flags ( read in namusr_def ) 
     53      LOGICAL                   , INTENT(  out) ::   ld_isfcav                   ! under iceshelf cavity flag 
     54      REAL(wp), DIMENSION(:)    , INTENT(  out) ::   pdept_1d, pdepw_1d          ! 1D grid-point depth     [m] 
     55      REAL(wp), DIMENSION(:)    , INTENT(  out) ::   pe3t_1d , pe3w_1d           ! 1D grid-point depth     [m] 
     56      REAL(wp), DIMENSION(:,:,:), INTENT(  out) ::   pdept, pdepw                ! grid-point depth        [m] 
     57      REAL(wp), DIMENSION(:,:,:), INTENT(  out) ::   pe3t , pe3u , pe3v , pe3f   ! vertical scale factors  [m] 
     58      REAL(wp), DIMENSION(:,:,:), INTENT(  out) ::   pe3w , pe3uw, pe3vw         ! i-scale factors  
     59      INTEGER , DIMENSION(:,:)  , INTENT(  out) ::   k_top, k_bot                ! first & last ocean level 
    6160      ! 
    6261      INTEGER  ::   ji, jj, jk        ! dummy indices 
     
    118117      !                               
    119118      ! 
    120       IF ( ln_sco ) THEN      !==  s-coordinate  ==!   (terrain-following coordinate) 
     119      IF ( ld_sco ) THEN      !==  s-coordinate  ==!   (terrain-following coordinate) 
    121120         ! 
    122121         k_bot(:,:) = jpkm1 * k_top(:,:)  !* bottom ocean = jpk-1 (here use k_top as a land mask) 
     
    139138      ! 
    140139      ! 
    141       IF ( ln_zco ) THEN      !==  z-coordinate  ==!   (step-like topography) 
     140      IF ( ld_zco ) THEN      !==  z-coordinate  ==!   (step-like topography) 
    142141         ! 
    143142         !                                !* bottom ocean compute from the depth of grid-points 
     
    161160      ! 
    162161      ! 
    163       IF ( ln_zps ) THEN      !==  zps-coordinate  ==!   (partial bottom-steps) 
     162      IF ( ld_zps ) THEN      !==  zps-coordinate  ==!   (partial bottom-steps) 
    164163         ! 
    165164         ze3min = 0.1_wp * rn_dz 
  • branches/2017/dev_merge_2017/NEMOGCM/CONFIG/TEST_CASES/SAS_BIPER/MY_SRC/usrdef_zgr.F90

    r9124 r9135  
    1414   !!--------------------------------------------------------------------- 
    1515   USE oce            ! ocean variables 
    16    USE dom_oce ,  ONLY: ln_zco, ln_zps, ln_sco   ! ocean space and time domain 
    1716   USE usrdef_nam     ! User defined : namelist variables 
    1817   ! 
     
    6463      ! 
    6564      ! 
    66       ! type of vertical coordinate 
     65      ! type of vertical coordinate  ==>>>   here SAS_BIPER : slab ocean always 
    6766      ! --------------------------- 
    6867      ld_zco    = .TRUE.       ! z-full-step coordinate 
  • branches/2017/dev_merge_2017/NEMOGCM/CONFIG/TEST_CASES/WAD/MY_SRC/usrdef_zgr.F90

    r9125 r9135  
    1515   !!--------------------------------------------------------------------- 
    1616   USE oce            ! ocean variables 
    17    USE dom_oce ,  ONLY: ln_zco, ln_zps, ln_sco   ! ocean space and time domain 
    1817   USE dom_oce ,  ONLY: ht_0, mi0, mi1, nimpp, njmpp,  & 
    1918                      & mj0, mj1, glamt, gphit         ! ocean space and time domain 
     
    7473      ! 
    7574      ! 
    76       ! type of vertical coordinate 
     75      ! type of vertical coordinate ==>>>   here WAD_TEST_CASES : s-coordinate always 
    7776      ! --------------------------- 
    78       ! set in usrdef_nam.F90 by reading the namusr_def namelist only ln_zco 
    79       ln_zco    = .FALSE.      ! z-partial-step coordinate 
    80       ln_zps    = .FALSE.      ! z-partial-step coordinate 
    81       ln_sco    = .TRUE.       ! s-coordinate 
     77      ld_zco    = .FALSE.      ! z-partial-step coordinate 
     78      ld_zps    = .FALSE.      ! z-partial-step coordinate 
     79      ld_sco    = .TRUE.       ! s-coordinate 
    8280      ld_isfcav = .FALSE.      ! ISF Ice Shelves Flag 
    8381      ! 
     
    279277      !                               
    280278      ! 
    281       IF ( ln_sco ) THEN      !==  s-coordinate  ==!   (terrain-following coordinate) 
     279      IF ( ld_sco ) THEN      !==  s-coordinate  ==!   (terrain-following coordinate) 
    282280         ! 
    283281         ht_0 = zht 
Note: See TracChangeset for help on using the changeset viewer.