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/SBC – 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:
29 edited
1 moved

Legend:

Unmodified
Added
Removed
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/cpl_oasis3.F90

    r9023 r9570  
    8585 
    8686   !!---------------------------------------------------------------------- 
    87    !! NEMO/OPA 3.3 , NEMO Consortium (2010) 
     87   !! NEMO/OCE 3.3 , NEMO Consortium (2010) 
    8888   !! $Id$ 
    8989   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/cyclone.F90

    r9125 r9570  
    3939#  include "vectopt_loop_substitute.h90" 
    4040   !!---------------------------------------------------------------------- 
    41    !! NEMO/OPA 3.3 , LOCEAN-IPSL (2010)  
     41   !! NEMO/OCE 3.3 , LOCEAN-IPSL (2010)  
    4242   !! $Id$  
    4343   !! Software governed by the CeCILL licence (modipsl/doc/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/fldread.F90

    r9125 r9570  
    123123 
    124124   !!---------------------------------------------------------------------- 
    125    !! NEMO/OPA 3.3 , NEMO Consortium (2010) 
     125   !! NEMO/OCE 3.3 , NEMO Consortium (2010) 
    126126   !! $Id$ 
    127127   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/geo2ocean.F90

    r9471 r9570  
    5353#  include "vectopt_loop_substitute.h90" 
    5454   !!---------------------------------------------------------------------- 
    55    !! NEMO/OPA 3.3 , NEMO Consortium (2010) 
     55   !! NEMO/OCE 3.3 , NEMO Consortium (2010) 
    5656   !! $Id$  
    5757   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/ocealb.F90

    r9125 r9570  
    2020   
    2121   !!---------------------------------------------------------------------- 
    22    !! NEMO/OPA 4.0 , NEMO Consortium (2010) 
     22   !! NEMO/OCE 4.0 , NEMO Consortium (2010) 
    2323   !! $Id: ocealb.F90 8268 2017-07-03 15:01:04Z clem $ 
    2424   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbc_ice.F90

    r9019 r9570  
    99   !!            3.4  ! 2011-11  (C. Harris) CICE added as an option 
    1010   !!---------------------------------------------------------------------- 
    11 #if defined key_lim3 || defined key_cice 
    12    !!---------------------------------------------------------------------- 
    13    !!   'key_lim3' or 'key_cice' :              LIM-3 or CICE sea-ice model 
     11#if defined key_si3 || defined key_cice 
     12   !!---------------------------------------------------------------------- 
     13   !!   'key_si3' or 'key_cice' :              LIM-3 or CICE sea-ice model 
    1414   !!---------------------------------------------------------------------- 
    1515   USE par_oce          ! ocean parameters 
    1616   USE sbc_oce          ! surface boundary condition: ocean 
    17 # if defined key_lim3 
     17# if defined key_si3 
    1818   USE ice              ! LIM-3 parameters 
    1919# endif 
     
    2929   PUBLIC   sbc_ice_alloc   ! called in sbcmod.F90 or sbcice_cice.F90 
    3030 
    31 # if defined  key_lim3 
     31# if defined  key_si3 
    3232   LOGICAL         , PUBLIC, PARAMETER ::   lk_lim3    = .TRUE.   !: LIM-3 ice model 
    3333   LOGICAL         , PUBLIC, PARAMETER ::   lk_cice    = .FALSE.  !: no CICE  
     
    5959   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   botmelt            !: category botmelt 
    6060 
    61 #if defined  key_lim3 
     61#if defined  key_si3 
    6262   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   evap_ice       !: sublimation                              [kg/m2/s] 
    6363   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   devap_ice      !: sublimation sensitivity                [kg/m2/s/K] 
     
    108108 
    109109   !!---------------------------------------------------------------------- 
    110    !! NEMO/OPA 4.0 , NEMO Consortium (2011) 
     110   !! NEMO/OCE 4.0 , NEMO Consortium (2011) 
    111111   !! $Id$  
    112112   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
     
    124124      ALLOCATE( snwice_mass(jpi,jpj) , snwice_mass_b(jpi,jpj), snwice_fmass(jpi,jpj) , STAT=ierr(1) ) 
    125125 
    126 #if defined key_lim3 
     126#if defined key_si3 
    127127      ALLOCATE( qns_ice (jpi,jpj,jpl) , qsr_ice  (jpi,jpj,jpl) ,     & 
    128128         &      qla_ice (jpi,jpj,jpl) , dqla_ice (jpi,jpj,jpl) ,     & 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbc_oce.F90

    r9115 r9570  
    152152#  include "vectopt_loop_substitute.h90" 
    153153   !!---------------------------------------------------------------------- 
    154    !! NEMO/OPA 4.0 , NEMO Consortium (2011) 
     154   !! NEMO/OCE 4.0 , NEMO Consortium (2011) 
    155155   !! $Id$ 
    156156   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbcapr.F90

    r9367 r9570  
    4141 
    4242   !!---------------------------------------------------------------------- 
    43    !! NEMO/OPA 4.0 , NEMO Consortium (2011)  
     43   !! NEMO/OCE 4.0 , NEMO Consortium (2011)  
    4444   !! $Id$ 
    4545   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbcblk.F90

    r9454 r9570  
    4545   USE sbc_ice        ! Surface boundary condition: ice fields 
    4646   USE lib_fortran    ! to use key_nosignedzero 
    47 #if defined key_lim3 
     47#if defined key_si3 
    4848   USE ice     , ONLY :   u_ice, v_ice, jpl, a_i_b, at_i_b, tm_su, rn_cnd_s 
    4949   USE icethd_dh      ! for CALL ice_thd_snwblow 
     
    6565   PUBLIC   sbc_blk_init  ! called in sbcmod 
    6666   PUBLIC   sbc_blk       ! called in sbcmod 
    67 #if defined key_lim3 
     67#if defined key_si3 
    6868   PUBLIC   blk_ice_tau   ! routine called in iceforcing 
    6969   PUBLIC   blk_ice_flx   ! routine called in iceforcing 
     
    134134#  include "vectopt_loop_substitute.h90" 
    135135   !!---------------------------------------------------------------------- 
    136    !! NEMO/OPA 3.7 , NEMO-consortium (2014) 
     136   !! NEMO/OCE 3.7 , NEMO-consortium (2014) 
    137137   !! $Id: sbcblk.F90 6416 2016-04-01 12:22:17Z clem $ 
    138138   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
     
    534534         &     * ( MIN( sf(jp_tair)%fnow(:,:,1), rt0_snow ) - rt0 ) * cpic * tmask(:,:,1) 
    535535      ! 
    536 #if defined key_lim3 
     536#if defined key_si3 
    537537      qns_oce(:,:) = zqlw(:,:) - zqsb(:,:) - zqla(:,:)                                ! non solar without emp (only needed by LIM3) 
    538538      qsr_oce(:,:) = qsr(:,:) 
     
    682682   END FUNCTION L_vap 
    683683 
    684 #if defined key_lim3 
     684#if defined key_si3 
    685685   !!---------------------------------------------------------------------- 
    686    !!   'key_lim3'                                       ESIM sea-ice model 
     686   !!   'key_si3'                                       SI3 sea-ice model 
    687687   !!---------------------------------------------------------------------- 
    688688   !!   blk_ice_tau : provide the air-ice stress 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbcblk_algo_coare.F90

    r9125 r9570  
    3232   USE sbc_oce        ! Surface boundary condition: ocean fields 
    3333   USE sbcwave, ONLY  :  cdn_wave ! wave module 
    34 #if defined key_lim3 || defined key_cice 
     34#if defined key_si3 || defined key_cice 
    3535   USE sbc_ice        ! Surface boundary condition: ice fields 
    3636#endif 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbcblk_algo_coare3p5.F90

    r9125 r9570  
    3232   USE sbc_oce         ! Surface boundary condition: ocean fields 
    3333   USE sbcwave, ONLY   :  cdn_wave ! wave module 
    34 #if defined key_lim3 || defined key_cice 
     34#if defined key_si3 || defined key_cice 
    3535   USE sbc_ice         ! Surface boundary condition: ice fields 
    3636#endif 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbcblk_algo_ecmwf.F90

    r9125 r9570  
    3535   USE prtctl          ! Print control 
    3636   USE sbcwave, ONLY   :  cdn_wave ! wave module 
    37 #if defined key_lim3 || defined key_cice 
     37#if defined key_si3 || defined key_cice 
    3838   USE sbc_ice         ! Surface boundary condition: ice fields 
    3939#endif 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbcblk_algo_ncar.F90

    r9125 r9570  
    2828   USE sbc_oce         ! Surface boundary condition: ocean fields 
    2929   USE sbcwave, ONLY   :  cdn_wave ! wave module 
    30 #if defined key_lim3 || defined key_cice 
     30#if defined key_si3 || defined key_cice 
    3131   USE sbc_ice         ! Surface boundary condition: ice fields 
    3232#endif 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbccpl.F90

    r9168 r9570  
    2727   USE sbcwave         ! surface boundary condition: waves 
    2828   USE phycst          ! physical constants 
    29 #if defined key_lim3 
     29#if defined key_si3 
    3030   USE ice            ! ice variables 
    3131#endif 
     
    4040   USE ice_domain_size, only: ncat 
    4141#endif 
    42 #if defined key_lim3 
     42#if defined key_si3 
    4343   USE icethd_dh      ! for CALL ice_thd_snwblow 
    4444#endif 
     
    200200#  include "vectopt_loop_substitute.h90" 
    201201   !!---------------------------------------------------------------------- 
    202    !! NEMO/OPA 3.3 , NEMO Consortium (2010) 
     202   !! NEMO/OCE 3.3 , NEMO Consortium (2010) 
    203203   !! $Id$ 
    204204   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
     
    216216      ALLOCATE( alb_oce_mix(jpi,jpj), nrcvinfo(jprcv),  STAT=ierr(1) ) 
    217217       
    218 #if ! defined key_lim3 && ! defined key_cice 
     218#if ! defined key_si3 && ! defined key_cice 
    219219      ALLOCATE( a_i(jpi,jpj,1) , STAT=ierr(2) )  ! used in sbcice_if.F90 (done here as there is no sbc_ice_if_init) 
    220220#endif 
     
    12441244      !                                                      !   ice skin temp.   ! 
    12451245      !                                                      ! ================== ! 
    1246 #if defined key_lim3 
     1246#if defined key_si3 
    12471247      ! needed by Met Office 
    12481248      IF( srcv(jpr_ts_ice)%laction ) THEN  
     
    17411741      END SELECT 
    17421742 
    1743 #if defined key_lim3 
     1743#if defined key_si3 
    17441744      ! zsnw = snow fraction over ice after wind blowing (=picefr if no blowing) 
    17451745      zsnw(:,:) = 0._wp   ;   CALL ice_thd_snwblow( ziceld, zsnw ) 
     
    18881888      IF( srcv(jpr_icb)%laction )   zqns_tot(:,:) = zqns_tot(:,:) - frcv(jpr_icb)%z3(:,:,1) * lfus  ! remove latent heat of iceberg melting 
    18891889 
    1890 #if defined key_lim3       
     1890#if defined key_si3       
    18911891      ! --- non solar flux over ocean --- ! 
    18921892      !         note: ziceld cannot be = 0 since we limit the ice concentration to amax 
     
    20232023      ENDIF 
    20242024 
    2025 #if defined key_lim3 
     2025#if defined key_si3 
    20262026      ! --- solar flux over ocean --- ! 
    20272027      !         note: ziceld cannot be = 0 since we limit the ice concentration to amax 
     
    20662066      ENDIF 
    20672067 
    2068 #if defined key_lim3       
     2068#if defined key_si3       
    20692069      !                                                      ! ========================= ! 
    20702070      SELECT CASE( TRIM( sn_rcv_iceflx%cldes ) )             !  ice topmelt and botmelt  ! 
     
    21872187      !                                                      ! 1st layer ice/snow temp.  ! 
    21882188      !                                                      ! ------------------------- ! 
    2189 #if defined key_lim3 
     2189#if defined key_si3 
    21902190      ! needed by  Met Office 
    21912191      IF( ssnd(jps_ttilyr)%laction) THEN 
     
    23112311      ENDIF 
    23122312 
    2313 #if defined key_lim3 
     2313#if defined key_si3 
    23142314      !                                                      ! ------------------------- ! 
    23152315      !                                                      !      Ice melt ponds       !  
     
    26842684      IF( ssnd(jps_taum  )%laction )  CALL cpl_snd( jps_taum  , isec, RESHAPE ( taum, (/jpi,jpj,1/) ), info ) 
    26852685 
    2686 #if defined key_lim3 
     2686#if defined key_si3 
    26872687      !                                                      ! ------------------------- ! 
    26882688      !                                                      ! Sea surface freezing temp !  
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbcdcy.F90

    r9124 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/SBC/sbcflx.F90

    r9168 r9570  
    4040#  include "vectopt_loop_substitute.h90" 
    4141   !!---------------------------------------------------------------------- 
    42    !! NEMO/OPA 3.3 , NEMO-consortium (2010)  
     42   !! NEMO/OCE 3.3 , NEMO-consortium (2010)  
    4343   !! $Id$ 
    4444   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbcfwb.F90

    r9168 r9570  
    4242#  include "vectopt_loop_substitute.h90" 
    4343   !!---------------------------------------------------------------------- 
    44    !! NEMO/OPA 3.3 , NEMO Consortium (2010) 
     44   !! NEMO/OCE 3.3 , NEMO Consortium (2010) 
    4545   !! $Id$ 
    4646   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
     
    9090         ! and in case of no melt, it can generate HSSW. 
    9191         ! 
    92 #if ! defined key_lim3 && ! defined key_cice 
     92#if ! defined key_si3 && ! defined key_cice 
    9393         snwice_mass_b(:,:) = 0.e0               ! no sea-ice model is being used : no snow+ice mass 
    9494         snwice_mass  (:,:) = 0.e0 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbcice_cice.F90

    r9168 r9570  
    8989 
    9090   !!---------------------------------------------------------------------- 
    91    !! NEMO/OPA 3.7 , NEMO-consortium (2015)  
     91   !! NEMO/OCE 3.7 , NEMO-consortium (2015)  
    9292   !! $Id$ 
    9393   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbcice_if.F90

    r9168 r9570  
    1616   USE eosbn2         ! equation of state 
    1717   USE sbc_oce        ! surface boundary condition: ocean fields 
    18 #if defined key_lim3 
     18#if defined key_si3 
    1919   USE ice            , ONLY :   a_i 
    2020#else 
     
    3636    
    3737   !!---------------------------------------------------------------------- 
    38    !! NEMO/OPA 3.3 , NEMO Consortium (2010) 
     38   !! NEMO/OCE 3.3 , NEMO Consortium (2010) 
    3939   !! $Id$ 
    4040   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbcisf.F90

    r9367 r9570  
    6969    
    7070   !!---------------------------------------------------------------------- 
    71    !! NEMO/OPA 4.0 , LOCEAN-IPSL (2017) 
     71   !! NEMO/OCE 4.0 , LOCEAN-IPSL (2017) 
    7272   !! $Id$ 
    7373   !! Software governed by the CeCILL licence (modipsl/doc/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbcmod.F90

    r9439 r9570  
    3333   USE sbcblk         ! surface boundary condition: bulk formulation 
    3434   USE sbcice_if      ! surface boundary condition: ice-if sea-ice model 
    35 #if defined key_lim3 
     35#if defined key_si3 
    3636   USE icestp         ! surface boundary condition: LIM 3.0 sea-ice model 
    3737#endif 
     
    6868 
    6969   !!---------------------------------------------------------------------- 
    70    !! NEMO/OPA 4.0 , NEMO-consortium (2016)  
     70   !! NEMO/OCE 4.0 , NEMO-consortium (2016)  
    7171   !! $Id$ 
    7272   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
     
    227227      !                             !* allocate sbc arrays 
    228228      IF( sbc_oce_alloc() /= 0 )   CALL ctl_stop( 'sbc_init : unable to allocate sbc_oce arrays' ) 
    229 #if ! defined key_lim3 && ! defined key_cice 
     229#if ! defined key_si3 && ! defined key_cice 
    230230      IF( sbc_ice_alloc() /= 0 )   CALL ctl_stop( 'sbc_init : unable to allocate sbc_ice arrays' ) 
    231231#endif 
     
    327327      IF( ln_apr_dyn )    CALL sbc_apr_init            ! Atmo Pressure Forcing initialization 
    328328      ! 
    329 #if defined key_lim3 
     329#if defined key_si3 
    330330      IF( lk_agrif .AND. nn_ice == 0 ) THEN            ! allocate ice arrays in case agrif + ice-model + no-ice in child grid 
    331331                          IF( sbc_ice_alloc() /= 0 )   CALL ctl_stop('STOP', 'sbc_ice_alloc : unable to allocate arrays' ) 
     
    426426      SELECT CASE( nn_ice )                                       ! Update heat and freshwater fluxes over sea-ice areas 
    427427      CASE(  1 )   ;         CALL sbc_ice_if   ( kt )             ! Ice-cover climatology ("Ice-if" model) 
    428 #if defined key_lim3 
     428#if defined key_si3 
    429429      CASE(  2 )   ;         CALL ice_stp  ( kt, nsbc )           ! LIM-3 ice model 
    430430#endif 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbcrnf.F90

    r9367 r9570  
    6969  
    7070   !!---------------------------------------------------------------------- 
    71    !! NEMO/OPA 3.3 , NEMO Consortium (2010) 
     71   !! NEMO/OCE 3.3 , NEMO Consortium (2010) 
    7272   !! $Id$ 
    7373   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbcssm.F90

    r9367 r9570  
    3232    
    3333   !!---------------------------------------------------------------------- 
    34    !! NEMO/OPA 3.3 , NEMO Consortium (2010) 
     34   !! NEMO/OCE 3.3 , NEMO Consortium (2010) 
    3535   !! $Id$ 
    3636   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbcssr.F90

    r9169 r9570  
    4747 
    4848   !!---------------------------------------------------------------------- 
    49    !! NEMO/OPA 4.0 , NEMO Consortium (2011) 
     49   !! NEMO/OCE 4.0 , NEMO Consortium (2011) 
    5050   !! $Id$ 
    5151   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbctide.F90

    r9125 r9570  
    3333  
    3434   !!---------------------------------------------------------------------- 
    35    !! NEMO/OPA 3.5 , NEMO Consortium (2013) 
     35   !! NEMO/OCE 3.5 , NEMO Consortium (2013) 
    3636   !! $Id$ 
    3737   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/sbcwave.F90

    r9168 r9570  
    7474#  include "vectopt_loop_substitute.h90" 
    7575   !!---------------------------------------------------------------------- 
    76    !! NEMO/OPA 3.7 , NEMO Consortium (2014)  
     76   !! NEMO/OCE 3.7 , NEMO Consortium (2014)  
    7777   !! $Id$ 
    7878   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/tide_mod.F90

    r9023 r9570  
    3434 
    3535   !!---------------------------------------------------------------------- 
    36    !! NEMO/OPA 3.3 , LOCEAN-IPSL (2010)  
     36   !! NEMO/OCE 3.3 , LOCEAN-IPSL (2010)  
    3737   !! $Id$  
    3838   !! Software governed by the CeCILL licence (modipsl/doc/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/tideini.F90

    r9337 r9570  
    3939 
    4040   !!---------------------------------------------------------------------- 
    41    !! NEMO/OPA 3.5 , NEMO Consortium (2013) 
     41   !! NEMO/OCE 3.5 , NEMO Consortium (2013) 
    4242   !! $Id$ 
    4343   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/SBC/updtide.F90

    r7646 r9570  
    2121   
    2222   !!---------------------------------------------------------------------- 
    23    !! NEMO/OPA 3.3 , NEMO Consortium (2010) 
     23   !! NEMO/OCE 3.3 , NEMO Consortium (2010) 
    2424   !! $Id$ 
    2525   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
Note: See TracChangeset for help on using the changeset viewer.