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/LBC – 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:
4 edited
1 moved

Legend:

Unmodified
Added
Removed
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/LBC/lbclnk.F90

    r9019 r9570  
    5151 
    5252   !!---------------------------------------------------------------------- 
    53    !! NEMO/OPA 4.0 , NEMO Consortium (2017) 
     53   !! NEMO/OCE 4.0 , NEMO Consortium (2017) 
    5454   !! $Id$ 
    5555   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
     
    103103    
    104104   !!---------------------------------------------------------------------- 
    105    !! NEMO/OPA 4.0 , NEMO Consortium (2017) 
     105   !! NEMO/OCE 4.0 , NEMO Consortium (2017) 
    106106   !! $Id$ 
    107107   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/LBC/lbcnfd.F90

    r9019 r9570  
    5656 
    5757   !!---------------------------------------------------------------------- 
    58    !! NEMO/OPA 3.3 , NEMO Consortium (2010) 
     58   !! NEMO/OCE 3.3 , NEMO Consortium (2010) 
    5959   !! $Id$ 
    6060   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/LBC/lib_mpp.F90

    r9467 r9570  
    129129   INTEGER ::   mpprank        ! process number  [ 0 - size-1 ] 
    130130!$AGRIF_DO_NOT_TREAT 
    131    INTEGER, PUBLIC ::   mpi_comm_opa   ! opa local communicator 
     131   INTEGER, PUBLIC ::   mpi_comm_oce   ! opa local communicator 
    132132!$AGRIF_END_DO_NOT_TREAT 
    133133 
     
    170170 
    171171   !!---------------------------------------------------------------------- 
    172    !! NEMO/OPA 4.0 , NEMO Consortium (2017) 
     172   !! NEMO/OCE 4.0 , NEMO Consortium (2017) 
    173173   !! $Id$ 
    174174   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
     
    253253         CASE ( 'B' )                ! Buffer mpi send (blocking) 
    254254            WRITE(ldtxt(ii),*) '           Buffer blocking mpi send (bsend)'              ;   ii = ii + 1 
    255             IF( Agrif_Root() )   CALL mpi_init_opa( ldtxt, ii, ierr ) 
     255            IF( Agrif_Root() )   CALL mpi_init_oce( ldtxt, ii, ierr ) 
    256256         CASE ( 'I' )                ! Immediate mpi send (non-blocking send) 
    257257            WRITE(ldtxt(ii),*) '           Immediate non-blocking send (isend)'           ;   ii = ii + 1 
     
    274274         CASE ( 'B' )                ! Buffer mpi send (blocking) 
    275275            WRITE(ldtxt(ii),*) '           Buffer blocking mpi send (bsend)'              ;   ii = ii + 1 
    276             IF( Agrif_Root() )   CALL mpi_init_opa( ldtxt, ii, ierr ) 
     276            IF( Agrif_Root() )   CALL mpi_init_oce( ldtxt, ii, ierr ) 
    277277         CASE ( 'I' )                ! Immediate mpi send (non-blocking send) 
    278278            WRITE(ldtxt(ii),*) '           Immediate non-blocking send (isend)'           ;   ii = ii + 1 
     
    289289      IF( PRESENT(localComm) ) THEN 
    290290         IF( Agrif_Root() ) THEN 
    291             mpi_comm_opa = localComm 
     291            mpi_comm_oce = localComm 
    292292         ENDIF 
    293293      ELSE 
    294          CALL mpi_comm_dup( mpi_comm_world, mpi_comm_opa, code) 
     294         CALL mpi_comm_dup( mpi_comm_world, mpi_comm_oce, code) 
    295295         IF( code /= MPI_SUCCESS ) THEN 
    296296            DO ji = 1, SIZE(ldtxt) 
     
    305305#if defined key_agrif 
    306306      IF( Agrif_Root() ) THEN 
    307          CALL Agrif_MPI_Init(mpi_comm_opa) 
     307         CALL Agrif_MPI_Init(mpi_comm_oce) 
    308308      ELSE 
    309          CALL Agrif_MPI_set_grid_comm(mpi_comm_opa) 
     309         CALL Agrif_MPI_set_grid_comm(mpi_comm_oce) 
    310310      ENDIF 
    311311#endif 
    312312 
    313       CALL mpi_comm_rank( mpi_comm_opa, mpprank, ierr ) 
    314       CALL mpi_comm_size( mpi_comm_opa, mppsize, ierr ) 
     313      CALL mpi_comm_rank( mpi_comm_oce, mpprank, ierr ) 
     314      CALL mpi_comm_size( mpi_comm_oce, mppsize, ierr ) 
    315315      mynode = mpprank 
    316316 
     
    492492      SELECT CASE ( cn_mpi_send ) 
    493493      CASE ( 'S' )                ! Standard mpi send (blocking) 
    494          CALL mpi_send ( pmess, kbytes, mpi_double_precision, kdest , ktyp, mpi_comm_opa        , iflag ) 
     494         CALL mpi_send ( pmess, kbytes, mpi_double_precision, kdest , ktyp, mpi_comm_oce        , iflag ) 
    495495      CASE ( 'B' )                ! Buffer mpi send (blocking) 
    496          CALL mpi_bsend( pmess, kbytes, mpi_double_precision, kdest , ktyp, mpi_comm_opa        , iflag ) 
     496         CALL mpi_bsend( pmess, kbytes, mpi_double_precision, kdest , ktyp, mpi_comm_oce        , iflag ) 
    497497      CASE ( 'I' )                ! Immediate mpi send (non-blocking send) 
    498498         ! be carefull, one more argument here : the mpi request identifier.. 
    499          CALL mpi_isend( pmess, kbytes, mpi_double_precision, kdest , ktyp, mpi_comm_opa, md_req, iflag ) 
     499         CALL mpi_isend( pmess, kbytes, mpi_double_precision, kdest , ktyp, mpi_comm_oce, md_req, iflag ) 
    500500      END SELECT 
    501501      ! 
     
    525525      IF( PRESENT(ksource) )   use_source = ksource 
    526526      ! 
    527       CALL mpi_recv( pmess, kbytes, mpi_double_precision, use_source, ktyp, mpi_comm_opa, istatus, iflag ) 
     527      CALL mpi_recv( pmess, kbytes, mpi_double_precision, use_source, ktyp, mpi_comm_oce, istatus, iflag ) 
    528528      ! 
    529529   END SUBROUTINE mpprecv 
     
    547547      itaille = jpi * jpj 
    548548      CALL mpi_gather( ptab, itaille, mpi_double_precision, pio, itaille     ,   & 
    549          &                            mpi_double_precision, kp , mpi_comm_opa, ierror ) 
     549         &                            mpi_double_precision, kp , mpi_comm_oce, ierror ) 
    550550      ! 
    551551   END SUBROUTINE mppgather 
     
    570570      ! 
    571571      CALL mpi_scatter( pio, itaille, mpi_double_precision, ptab, itaille     ,   & 
    572          &                            mpi_double_precision, kp  , mpi_comm_opa, ierror ) 
     572         &                            mpi_double_precision, kp  , mpi_comm_oce, ierror ) 
    573573      ! 
    574574   END SUBROUTINE mppscatter 
     
    587587      INTEGER, DIMENSION(kdim) ::   iwork 
    588588      !!---------------------------------------------------------------------- 
    589       ilocalcomm = mpi_comm_opa 
     589      ilocalcomm = mpi_comm_oce 
    590590      IF( PRESENT(kcom) )   ilocalcomm = kcom 
    591591      CALL mpi_allreduce( ktab, iwork, kdim, mpi_integer, mpi_max, ilocalcomm, ierror ) 
     
    599599      INTEGER ::   ierror, iwork, ilocalcomm   ! temporary integer 
    600600      !!---------------------------------------------------------------------- 
    601       ilocalcomm = mpi_comm_opa 
     601      ilocalcomm = mpi_comm_oce 
    602602      IF( PRESENT(kcom) )   ilocalcomm = kcom 
    603603      CALL mpi_allreduce( ktab, iwork, 1, mpi_integer, mpi_max, ilocalcomm, ierror ) 
     
    613613      REAL(wp), DIMENSION(kdim) ::  zwork 
    614614      !!---------------------------------------------------------------------- 
    615       ilocalcomm = mpi_comm_opa 
     615      ilocalcomm = mpi_comm_oce 
    616616      IF( PRESENT(kcom) )   ilocalcomm = kcom 
    617617      CALL mpi_allreduce( ptab, zwork, kdim, mpi_double_precision, mpi_max, ilocalcomm, ierror ) 
     
    626626      REAL(wp) ::   zwork 
    627627      !!---------------------------------------------------------------------- 
    628       ilocalcomm = mpi_comm_opa 
     628      ilocalcomm = mpi_comm_oce 
    629629      IF( PRESENT(kcom) )   ilocalcomm = kcom! 
    630630      CALL mpi_allreduce( ptab, zwork, 1, mpi_double_precision, mpi_max, ilocalcomm, ierror ) 
     
    647647      INTEGER, DIMENSION(kdim) ::   iwork 
    648648      !!---------------------------------------------------------------------- 
    649       ilocalcomm = mpi_comm_opa 
     649      ilocalcomm = mpi_comm_oce 
    650650      IF( PRESENT(kcom) )   ilocalcomm = kcom 
    651651      CALL mpi_allreduce( ktab, iwork, kdim, mpi_integer, mpi_min, ilocalcomm, ierror ) 
     
    660660      INTEGER ::  ierror, iwork, ilocalcomm 
    661661      !!---------------------------------------------------------------------- 
    662       ilocalcomm = mpi_comm_opa 
     662      ilocalcomm = mpi_comm_oce 
    663663      IF( PRESENT(kcom) )   ilocalcomm = kcom 
    664664      CALL mpi_allreduce( ktab, iwork, 1, mpi_integer, mpi_min, ilocalcomm, ierror ) 
     
    674674      REAL(wp), DIMENSION(kdim) ::   zwork 
    675675      !!----------------------------------------------------------------------- 
    676       ilocalcomm = mpi_comm_opa 
     676      ilocalcomm = mpi_comm_oce 
    677677      IF( PRESENT(kcom) )   ilocalcomm = kcom 
    678678      CALL mpi_allreduce( ptab, zwork, kdim, mpi_double_precision, mpi_min, ilocalcomm, ierror ) 
     
    687687      REAL(wp) ::   zwork 
    688688      !!----------------------------------------------------------------------- 
    689       ilocalcomm = mpi_comm_opa 
     689      ilocalcomm = mpi_comm_oce 
    690690      IF( PRESENT(kcom) )   ilocalcomm = kcom 
    691691      CALL mpi_allreduce( ptab, zwork, 1, mpi_double_precision, mpi_min, ilocalcomm, ierror ) 
     
    707707      INTEGER, DIMENSION (kdim) ::  iwork 
    708708      !!---------------------------------------------------------------------- 
    709       CALL mpi_allreduce( ktab, iwork, kdim, mpi_integer, mpi_sum, mpi_comm_opa, ierror ) 
     709      CALL mpi_allreduce( ktab, iwork, kdim, mpi_integer, mpi_sum, mpi_comm_oce, ierror ) 
    710710      ktab(:) = iwork(:) 
    711711   END SUBROUTINE mppsum_a_int 
     
    716716      INTEGER :: ierror, iwork 
    717717      !!---------------------------------------------------------------------- 
    718       CALL mpi_allreduce( ktab, iwork, 1, mpi_integer, mpi_sum, mpi_comm_opa, ierror ) 
     718      CALL mpi_allreduce( ktab, iwork, 1, mpi_integer, mpi_sum, mpi_comm_oce, ierror ) 
    719719      ktab = iwork 
    720720   END SUBROUTINE mppsum_int 
     
    728728      REAL(wp) ::   zwork(kdim)           ! local workspace 
    729729      !!----------------------------------------------------------------------- 
    730       ilocalcomm = mpi_comm_opa 
     730      ilocalcomm = mpi_comm_oce 
    731731      IF( PRESENT(kcom) )   ilocalcomm = kcom 
    732732      CALL mpi_allreduce( ptab, zwork, kdim, mpi_double_precision, mpi_sum, ilocalcomm, ierror ) 
     
    741741      REAL(wp) ::   zwork 
    742742      !!----------------------------------------------------------------------- 
    743       ilocalcomm = mpi_comm_opa 
     743      ilocalcomm = mpi_comm_oce 
    744744      IF( PRESENT(kcom) )   ilocalcomm = kcom 
    745745      CALL mpi_allreduce( ptab, zwork, 1, mpi_double_precision, mpi_sum, ilocalcomm, ierror ) 
     
    754754      COMPLEX(wp) ::   zwork 
    755755      !!----------------------------------------------------------------------- 
    756       ilocalcomm = mpi_comm_opa 
     756      ilocalcomm = mpi_comm_oce 
    757757      IF( PRESENT(kcom) )   ilocalcomm = kcom 
    758758      CALL MPI_ALLREDUCE( ytab, zwork, 1, MPI_DOUBLE_COMPLEX, MPI_SUMDD, ilocalcomm, ierror ) 
     
    768768      COMPLEX(wp), DIMENSION(kdim) :: zwork     ! temporary workspace 
    769769      !!----------------------------------------------------------------------- 
    770       ilocalcomm = mpi_comm_opa 
     770      ilocalcomm = mpi_comm_oce 
    771771      IF( PRESENT(kcom) )   ilocalcomm = kcom 
    772772      CALL MPI_ALLREDUCE( ytab, zwork, kdim, MPI_DOUBLE_COMPLEX, MPI_SUMDD, ilocalcomm, ierror ) 
     
    789789      REAL(wp), DIMENSION(kdim) ::  zwork 
    790790      !!---------------------------------------------------------------------- 
    791       ilocalcomm = mpi_comm_opa 
     791      ilocalcomm = mpi_comm_oce 
    792792      IF( PRESENT(kcom) )   ilocalcomm = kcom 
    793793      ! 
     
    828828      zain(2,:)=ki+10000.*kj 
    829829      ! 
    830       CALL MPI_ALLREDUCE( zain,zaout, 1, MPI_2DOUBLE_PRECISION,MPI_MINLOC,MPI_COMM_OPA,ierror) 
     830      CALL MPI_ALLREDUCE( zain,zaout, 1, MPI_2DOUBLE_PRECISION,MPI_MINLOC,MPI_COMM_OCE,ierror) 
    831831      ! 
    832832      pmin = zaout(1,1) 
     
    868868      zain(2,:) = ki + 10000.*kj + 100000000.*kk 
    869869      ! 
    870       CALL MPI_ALLREDUCE( zain,zaout, 1, MPI_2DOUBLE_PRECISION,MPI_MINLOC,MPI_COMM_OPA,ierror) 
     870      CALL MPI_ALLREDUCE( zain,zaout, 1, MPI_2DOUBLE_PRECISION,MPI_MINLOC,MPI_COMM_OCE,ierror) 
    871871      ! 
    872872      pmin = zaout(1,1) 
     
    908908      zain(2,:) = ki + 10000. * kj 
    909909      ! 
    910       CALL MPI_ALLREDUCE( zain,zaout, 1, MPI_2DOUBLE_PRECISION,MPI_MAXLOC,MPI_COMM_OPA,ierror) 
     910      CALL MPI_ALLREDUCE( zain,zaout, 1, MPI_2DOUBLE_PRECISION,MPI_MAXLOC,MPI_COMM_OCE,ierror) 
    911911      ! 
    912912      pmax = zaout(1,1) 
     
    948948      zain(2,:) = ki + 10000.*kj + 100000000.*kk 
    949949      ! 
    950       CALL MPI_ALLREDUCE( zain,zaout, 1, MPI_2DOUBLE_PRECISION,MPI_MAXLOC,MPI_COMM_OPA,ierror) 
     950      CALL MPI_ALLREDUCE( zain,zaout, 1, MPI_2DOUBLE_PRECISION,MPI_MAXLOC,MPI_COMM_OCE,ierror) 
    951951      ! 
    952952      pmax = zaout(1,1) 
     
    968968      !!----------------------------------------------------------------------- 
    969969      ! 
    970       CALL mpi_barrier( mpi_comm_opa, ierror ) 
     970      CALL mpi_barrier( mpi_comm_oce, ierror ) 
    971971      ! 
    972972   END SUBROUTINE mppsync 
     
    10471047      ! 
    10481048      zwork = 0 
    1049       CALL MPI_ALLREDUCE( kice, zwork, jpnij, mpi_integer, mpi_sum, mpi_comm_opa, ierr ) 
     1049      CALL MPI_ALLREDUCE( kice, zwork, jpnij, mpi_integer, mpi_sum, mpi_comm_oce, ierr ) 
    10501050      ndim_rank_ice = SUM( zwork ) 
    10511051 
     
    10641064 
    10651065      ! Create the world group 
    1066       CALL MPI_COMM_GROUP( mpi_comm_opa, ngrp_iworld, ierr ) 
     1066      CALL MPI_COMM_GROUP( mpi_comm_oce, ngrp_iworld, ierr ) 
    10671067 
    10681068      ! Create the ice group from the world group 
     
    10701070 
    10711071      ! Create the ice communicator , ie the pool of procs with sea-ice 
    1072       CALL MPI_COMM_CREATE( mpi_comm_opa, ngrp_ice, ncomm_ice, ierr ) 
     1072      CALL MPI_COMM_CREATE( mpi_comm_oce, ngrp_ice, ncomm_ice, ierr ) 
    10731073 
    10741074      ! Find proc number in the world of proc 0 in the north 
     
    11111111      !-$$     WRITE (numout,*) 'mpp_ini_znl ', nproc, ' - ngrp_world     : ', ngrp_world 
    11121112      !-$$     WRITE (numout,*) 'mpp_ini_znl ', nproc, ' - mpi_comm_world : ', mpi_comm_world 
    1113       !-$$     WRITE (numout,*) 'mpp_ini_znl ', nproc, ' - mpi_comm_opa   : ', mpi_comm_opa 
     1113      !-$$     WRITE (numout,*) 'mpp_ini_znl ', nproc, ' - mpi_comm_oce   : ', mpi_comm_oce 
    11141114      ! 
    11151115      ALLOCATE( kwork(jpnij), STAT=ierr ) 
     
    11221122      IF( jpnj == 1 ) THEN 
    11231123         ngrp_znl  = ngrp_world 
    1124          ncomm_znl = mpi_comm_opa 
     1124         ncomm_znl = mpi_comm_oce 
    11251125      ELSE 
    11261126         ! 
    1127          CALL MPI_ALLGATHER ( njmpp, 1, mpi_integer, kwork, 1, mpi_integer, mpi_comm_opa, ierr ) 
     1127         CALL MPI_ALLGATHER ( njmpp, 1, mpi_integer, kwork, 1, mpi_integer, mpi_comm_oce, ierr ) 
    11281128         !-$$        WRITE (numout,*) 'mpp_ini_znl ', nproc, ' - kwork pour njmpp : ', kwork 
    11291129         !-$$        CALL flush(numout) 
     
    11531153 
    11541154         ! Create the opa group 
    1155          CALL MPI_COMM_GROUP(mpi_comm_opa,ngrp_opa,ierr) 
     1155         CALL MPI_COMM_GROUP(mpi_comm_oce,ngrp_opa,ierr) 
    11561156         !-$$        WRITE (numout,*) 'mpp_ini_znl ', nproc, ' - ngrp_opa : ', ngrp_opa 
    11571157         !-$$        CALL flush(numout) 
     
    11631163 
    11641164         ! Create the znl communicator from the opa communicator, ie the pool of procs in the same row 
    1165          CALL MPI_COMM_CREATE ( mpi_comm_opa, ngrp_znl, ncomm_znl, ierr ) 
     1165         CALL MPI_COMM_CREATE ( mpi_comm_oce, ngrp_znl, ncomm_znl, ierr ) 
    11661166         !-$$        WRITE (numout,*) 'mpp_ini_znl ', nproc, ' - ncomm_znl ', ncomm_znl 
    11671167         !-$$        CALL flush(numout) 
     
    12341234      ! 
    12351235      ! create the world group 
    1236       CALL MPI_COMM_GROUP( mpi_comm_opa, ngrp_world, ierr ) 
     1236      CALL MPI_COMM_GROUP( mpi_comm_oce, ngrp_world, ierr ) 
    12371237      ! 
    12381238      ! Create the North group from the world group 
     
    12401240      ! 
    12411241      ! Create the North communicator , ie the pool of procs in the north group 
    1242       CALL MPI_COMM_CREATE( mpi_comm_opa, ngrp_north, ncomm_north, ierr ) 
     1242      CALL MPI_COMM_CREATE( mpi_comm_oce, ngrp_north, ncomm_north, ierr ) 
    12431243      ! 
    12441244   END SUBROUTINE mpp_ini_north 
    12451245 
    12461246 
    1247    SUBROUTINE mpi_init_opa( ldtxt, ksft, code ) 
     1247   SUBROUTINE mpi_init_oce( ldtxt, ksft, code ) 
    12481248      !!--------------------------------------------------------------------- 
    12491249      !!                   ***  routine mpp_init.opa  *** 
     
    12761276      IF( .NOT. mpi_was_called ) THEN 
    12771277         CALL mpi_init( code ) 
    1278          CALL mpi_comm_dup( mpi_comm_world, mpi_comm_opa, code ) 
     1278         CALL mpi_comm_dup( mpi_comm_world, mpi_comm_oce, code ) 
    12791279         IF ( code /= MPI_SUCCESS ) THEN 
    12801280            DO ji = 1, SIZE(ldtxt) 
     
    13021302      ENDIF 
    13031303      ! 
    1304    END SUBROUTINE mpi_init_opa 
     1304   END SUBROUTINE mpi_init_oce 
    13051305 
    13061306 
     
    16231623   LOGICAL, PUBLIC            ::   ln_nnogather          !: namelist control of northfold comms (needed here in case "key_mpp_mpi" is not used) 
    16241624   INTEGER :: ncomm_ice 
    1625    INTEGER, PUBLIC            ::   mpi_comm_opa          ! opa local communicator 
     1625   INTEGER, PUBLIC            ::   mpi_comm_oce          ! opa local communicator 
    16261626   !!---------------------------------------------------------------------- 
    16271627CONTAINS 
     
    16371637      CHARACTER(len=*) ::   ldname 
    16381638      INTEGER ::   kumnam_ref, knumnam_cfg , kumond , kstop 
    1639       IF( PRESENT( localComm ) ) mpi_comm_opa = localComm 
     1639      IF( PRESENT( localComm ) ) mpi_comm_oce = localComm 
    16401640      function_value = 0 
    16411641      IF( .FALSE. )   ldtxt(:) = 'never done' 
  • branches/2017/dev_merge_2017/NEMOGCM/NEMO/OCE_SRC/LBC/mppini.F90

    r9564 r9570  
    3737 
    3838   !!---------------------------------------------------------------------- 
    39    !! NEMO/OPA 4.0 , NEMO Consortium (2017) 
     39   !! NEMO/OCE 4.0 , NEMO Consortium (2017) 
    4040   !! $Id$  
    4141   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt) 
Note: See TracChangeset for help on using the changeset viewer.