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 9570 for branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/BDY – NEMO

Ignore:
Timestamp:
2018-05-11T12:53:25+02:00 (6 years ago)
Author:
nicolasmartin
Message:

Global renaming for core routines (./NEMO)

  • Folders
    • LIM_SRC_3 -> ICE_SRC
    • OPA_SRC -> OCE_SRC
  • CPP key: key_lim3 -> key_si3
  • Modules, (sub)routines and variables names
    • MPI: mpi_comm_opa -> mpi_comm_oce, MPI_COMM_OPA -> MPI_COMM_OCE, mpi_init_opa -> mpi_init_oce
    • AGRIF: agrif_opa_* -> agrif_oce_*, agrif_lim3_* -> agrif_si3_* and few more
    • TOP-PISCES: p.zlim -> p.zice, namp.zlim -> namp.zice
  • Comments
    • NEMO/OPA -> NEMO/OCE
    • ESIM|LIM3 -> SI3
Location:
branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC
Files:
11 edited
1 moved

Legend:

Unmodified
Added
Removed
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/BDY/bdy_oce.F90

    r9019 r9570  
    5555      REAL(wp), POINTER, DIMENSION(:,:) ::  tem 
    5656      REAL(wp), POINTER, DIMENSION(:,:) ::  sal 
    57 #if defined key_lim3 
     57#if defined key_si3 
    5858      LOGICAL                           ::   ll_a_i 
    5959      LOGICAL                           ::   ll_h_i 
     
    139139!$AGRIF_END_DO_NOT_TREAT 
    140140   !!---------------------------------------------------------------------- 
    141    !! NEMO/OPA 4.0 , NEMO Consortium (2011) 
     141   !! NEMO/OCE 4.0 , NEMO Consortium (2011) 
    142142   !! $Id$  
    143143   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/BDY/bdydta.F90

    r9168 r9570  
    2525   USE bdy_oce        ! ocean open boundary conditions   
    2626   USE bdytides       ! tidal forcing at boundaries 
    27 #if defined key_lim3 
     27#if defined key_si3 
    2828   USE ice            ! sea-ice variables 
    2929   USE icevar         ! redistribute ice input into categories 
     
    5050   TYPE(MAP_POINTER), ALLOCATABLE, DIMENSION(:) :: nbmap_ptr   ! array of pointers to nbmap 
    5151 
    52 #if defined key_lim3 
     52#if defined key_si3 
    5353   INTEGER ::   nice_cat                      ! number of categories in the input file 
    5454   INTEGER ::   jfld_hti, jfld_hts, jfld_ai   ! indices of ice thickness, snow thickness and concentration in bf structure 
     
    5656 
    5757   !!---------------------------------------------------------------------- 
    58    !! NEMO/OPA 4.0 , NEMO Consortium (2017) 
     58   !! NEMO/OCE 4.0 , NEMO Consortium (2017) 
    5959   !! $Id$  
    6060   !! Software governed by the CeCILL licence (NEMOGCM/NEMO_CeCILL.txt) 
     
    178178            ENDIF 
    179179 
    180 #if defined key_lim3 
     180#if defined key_si3 
    181181            IF( nn_ice_lim_dta(jbdy) == 0 ) THEN    ! set ice to initial values 
    182182               ilen1(:) = nblen(:) 
     
    348348 
    349349               ENDIF 
    350 #if defined key_lim3 
     350#if defined key_si3 
    351351               IF( cn_ice_lim(jbdy) /= 'none' .AND. nn_ice_lim_dta(jbdy) == 1 ) THEN 
    352352                  IF( nice_cat == 1 ) THEN ! case input cat = 1 
     
    423423      INTEGER, POINTER, DIMENSION(:)         ::   nblen, nblenrim  ! short cuts 
    424424      TYPE(OBC_DATA), POINTER                ::   dta           ! short cut 
    425 #if defined key_lim3 
     425#if defined key_si3 
    426426      INTEGER               ::   kndims   ! number of dimensions in an array (i.e. 3 = wo ice cat; 4 = w ice cat) 
    427427      INTEGER, DIMENSION(4) ::   kdimsz   ! size   of dimensions 
     
    431431      TYPE(FLD_N) ::   bn_tem, bn_sal, bn_u3d, bn_v3d   !  
    432432      TYPE(FLD_N) ::   bn_ssh, bn_u2d, bn_v2d           ! informations about the fields to be read 
    433 #if defined key_lim3 
     433#if defined key_si3 
    434434      TYPE(FLD_N) ::   bn_a_i, bn_h_i, bn_h_s       
    435435#endif 
    436436      NAMELIST/nambdy_dta/ cn_dir, bn_tem, bn_sal, bn_u3d, bn_v3d, bn_ssh, bn_u2d, bn_v2d  
    437 #if defined key_lim3 
     437#if defined key_si3 
    438438      NAMELIST/nambdy_dta/ bn_a_i, bn_h_i, bn_h_s 
    439439#endif 
     
    451451            &                , nn_dyn3d_dta  (jbdy)    & 
    452452            &                , nn_tra_dta    (jbdy)    & 
    453 #if defined key_lim3 
     453#if defined key_si3 
    454454            &                , nn_ice_lim_dta(jbdy)    & 
    455455#endif 
     
    472472            nb_bdy_fld(jbdy) = nb_bdy_fld(jbdy) + 2 
    473473         ENDIF 
    474 #if defined key_lim3 
     474#if defined key_si3 
    475475         IF( cn_ice_lim(jbdy) /= 'none' .AND. nn_ice_lim_dta(jbdy) == 1  ) THEN 
    476476            nb_bdy_fld(jbdy) = nb_bdy_fld(jbdy) + 3 
     
    612612            ENDIF 
    613613 
    614 #if defined key_lim3 
     614#if defined key_si3 
    615615            ! sea ice 
    616616            IF( nn_ice_lim_dta(jbdy) == 1 ) THEN 
     
    791791         ENDIF 
    792792 
    793 #if defined key_lim3 
     793#if defined key_si3 
    794794         IF (cn_ice_lim(jbdy) /= 'none') THEN 
    795795            IF( nn_ice_lim_dta(jbdy) == 0 ) THEN 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/BDY/bdydyn.F90

    r9125 r9570  
    3131 
    3232   !!---------------------------------------------------------------------- 
    33    !! NEMO/OPA 3.3 , NEMO Consortium (2010) 
     33   !! NEMO/OCE 3.3 , NEMO Consortium (2010) 
    3434   !! $Id$  
    3535   !! Software governed by the CeCILL licence (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/BDY/bdydyn2d.F90

    r9124 r9570  
    3030 
    3131   !!---------------------------------------------------------------------- 
    32    !! NEMO/OPA 3.3 , NEMO Consortium (2010) 
     32   !! NEMO/OCE 3.3 , NEMO Consortium (2010) 
    3333   !! $Id$  
    3434   !! Software governed by the CeCILL licence (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/BDY/bdydyn3d.F90

    r9124 r9570  
    2626 
    2727   !!---------------------------------------------------------------------- 
    28    !! NEMO/OPA 3.3 , NEMO Consortium (2010) 
     28   !! NEMO/OCE 3.3 , NEMO Consortium (2010) 
    2929   !! $Id$  
    3030   !! Software governed by the CeCILL licence (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/BDY/bdyice.F90

    r9124 r9570  
    88   !!              -   !  2012-01 (C. Rousset)  add lim3 and remove useless jk loop  
    99   !!---------------------------------------------------------------------- 
    10 #if defined key_lim3 
    11    !!---------------------------------------------------------------------- 
    12    !!   'key_lim3'                                                 LIM-3 sea ice model 
     10#if defined key_si3 
     11   !!---------------------------------------------------------------------- 
     12   !!   'key_si3'                                                 LIM-3 sea ice model 
    1313   !!---------------------------------------------------------------------- 
    1414   !!   bdy_ice        : Application of open boundaries to ice 
     
    4040 
    4141   !!---------------------------------------------------------------------- 
    42    !! NEMO/OPA 4.0 , NEMO Consortium (2017) 
     42   !! NEMO/OCE 4.0 , NEMO Consortium (2017) 
    4343   !! $Id: bdyice.F90 8306 2017-07-10 10:18:03Z clem $ 
    4444   !! Software governed by the CeCILL licence (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/BDY/bdyini.F90

    r9449 r9570  
    4545   INTEGER, DIMENSION(jp_nseg) ::   jpjsob, jpisdt, jpisft, npckgs   ! 
    4646   !!---------------------------------------------------------------------- 
    47    !! NEMO/OPA 3.7 , NEMO Consortium (2015) 
     47   !! NEMO/OCE 3.7 , NEMO Consortium (2015) 
    4848   !! $Id$  
    4949   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
     
    342342        IF(lwp) WRITE(numout,*) 
    343343 
    344 #if defined key_lim3 
     344#if defined key_si3 
    345345         IF(lwp) WRITE(numout,*) 'Boundary conditions for sea ice:  ' 
    346346         SELECT CASE( cn_ice_lim(ib_bdy) )                   
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/BDY/bdylib.F90

    r9124 r9570  
    2727 
    2828   !!---------------------------------------------------------------------- 
    29    !! NEMO/OPA 4.0 , NEMO Consortium (2016) 
     29   !! NEMO/OCE 4.0 , NEMO Consortium (2016) 
    3030   !! $Id$  
    3131   !! Software governed by the CeCILL licence (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/BDY/bdytides.F90

    r9168 r9570  
    4646 
    4747   !!---------------------------------------------------------------------- 
    48    !! NEMO/OPA 3.3 , NEMO Consortium (2010) 
     48   !! NEMO/OCE 3.3 , NEMO Consortium (2010) 
    4949   !! $Id$ 
    5050   !! Software governed by the CeCILL licence (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/BDY/bdytra.F90

    r9124 r9570  
    3333 
    3434   !!---------------------------------------------------------------------- 
    35    !! NEMO/OPA 4.0, NEMO Consortium (2016) 
     35   !! NEMO/OCE 4.0, NEMO Consortium (2016) 
    3636   !! $Id$  
    3737   !! Software governed by the CeCILL licence (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/BDY/bdyvol.F90

    r9124 r9570  
    2727 
    2828   !!---------------------------------------------------------------------- 
    29    !! NEMO/OPA 3.7 , NEMO Consortium (2015) 
     29   !! NEMO/OCE 3.7 , NEMO Consortium (2015) 
    3030   !! $Id$  
    3131   !! Software governed by the CeCILL licence (NEMOGCM/NEMO_CeCILL.txt) 
Note: See TracChangeset for help on using the changeset viewer.