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 14227 for NEMO – NEMO

Changeset 14227 for NEMO


Ignore:
Timestamp:
2020-12-20T12:57:00+01:00 (3 years ago)
Author:
smasson
Message:

trunk: replace remaining OPA by OCE

Location:
NEMO/trunk
Files:
24 edited

Legend:

Unmodified
Added
Removed
  • NEMO/trunk/cfgs/SHARED/namelist_ref

    r14187 r14227  
    220220   nn_components = 0       !  configuration of the opa-sas OASIS coupling 
    221221      !                    !  =0 no opa-sas OASIS coupling: default single executable config. 
    222       !                    !  =1 opa-sas OASIS coupling: multi executable config., OPA component 
     222      !                    !  =1 opa-sas OASIS coupling: multi executable config., OCE component 
    223223      !                    !  =2 opa-sas OASIS coupling: multi executable config., SAS component 
    224224                     ! Sea-ice : 
  • NEMO/trunk/src/NST/agrif_oce_interp.F90

    r14218 r14227  
    22   !!====================================================================== 
    33   !!                   ***  MODULE  agrif_oce_interp  *** 
    4    !! AGRIF: interpolation package for the ocean dynamics (OPA) 
     4   !! AGRIF: interpolation package for the ocean dynamics (OCE) 
    55   !!====================================================================== 
    66   !! History :  2.0  !  2002-06  (L. Debreu)  Original cade 
  • NEMO/trunk/src/NST/agrif_oce_sponge.F90

    r14218 r14227  
    44   !!====================================================================== 
    55   !!                   ***  MODULE  agrif_oce_interp  *** 
    6    !! AGRIF: sponge package for the ocean dynamics (OPA) 
     6   !! AGRIF: sponge package for the ocean dynamics (OCE) 
    77   !!====================================================================== 
    88   !! History :  2.0  !  2002-06  (XXX)  Original cade 
  • NEMO/trunk/src/NST/agrif_oce_update.F90

    r14143 r14227  
    66   !!====================================================================== 
    77   !!                   ***  MODULE  agrif_oce_interp  *** 
    8    !! AGRIF: update package for the ocean dynamics (OPA) 
     8   !! AGRIF: update package for the ocean dynamics (OCE) 
    99   !!====================================================================== 
    1010   !! History :  2.0  !  2002-06  (L. Debreu)  Original code 
  • NEMO/trunk/src/OCE/C1D/step_c1d.F90

    r14072 r14227  
    4141      !! 
    4242      !! ** Purpose :  - Time stepping of SBC including sea ice (dynamic and thermodynamic eqs.) 
    43       !!               - Time stepping of OPA (momentum and active tracer eqs.) 
     43      !!               - Time stepping of OCE (momentum and active tracer eqs.) 
    4444      !!               - Time stepping of TOP (passive tracer eqs.) 
    4545      !! 
  • NEMO/trunk/src/OCE/DYN/dynhpg.F90

    r14143 r14227  
    419419         IF(lwp) WRITE(numout,*) 
    420420         IF(lwp) WRITE(numout,*) 'dyn:hpg_sco : hydrostatic pressure gradient trend' 
    421          IF(lwp) WRITE(numout,*) '~~~~~~~~~~~   s-coordinate case, OPA original scheme used' 
     421         IF(lwp) WRITE(numout,*) '~~~~~~~~~~~   s-coordinate case, OCE original scheme used' 
    422422      ENDIF 
    423423      ! 
  • NEMO/trunk/src/OCE/SBC/cpl_oasis3.F90

    r14072 r14227  
    115115 
    116116      !------------------------------------------------------------------ 
    117       ! 3rd Get an MPI communicator for OPA local communication 
     117      ! 3rd Get an MPI communicator for OCE local communication 
    118118      !------------------------------------------------------------------ 
    119119 
  • NEMO/trunk/src/OCE/SBC/sbc_oce.F90

    r14072 r14227  
    8787   INTEGER , PUBLIC, PARAMETER ::   jp_abl     = 4        !: Atmospheric boundary layer    formulation 
    8888   INTEGER , PUBLIC, PARAMETER ::   jp_purecpl = 5        !: Pure ocean-atmosphere Coupled formulation 
    89    INTEGER , PUBLIC, PARAMETER ::   jp_none    = 6        !: for OPA when doing coupling via SAS module 
     89   INTEGER , PUBLIC, PARAMETER ::   jp_none    = 6        !: for OCE when doing coupling via SAS module 
    9090   ! 
    9191   !!---------------------------------------------------------------------- 
     
    9494   INTEGER , PUBLIC, PARAMETER ::   jp_iam_nemo = 0      !: Initial single executable configuration 
    9595   !  (no internal OASIS coupling) 
    96    INTEGER , PUBLIC, PARAMETER ::   jp_iam_opa  = 1      !: Multi executable configuration - OPA component 
     96   INTEGER , PUBLIC, PARAMETER ::   jp_iam_oce  = 1      !: Multi executable configuration - OCE component 
    9797   !  (internal OASIS coupling) 
    9898   INTEGER , PUBLIC, PARAMETER ::   jp_iam_sas  = 2      !: Multi executable configuration - SAS component 
  • NEMO/trunk/src/OCE/SBC/sbccpl.F90

    r14100 r14227  
    157157   INTEGER, PARAMETER ::   jps_rnf    = 24   ! runoffs 
    158158   INTEGER, PARAMETER ::   jps_taum   = 25   ! wind stress module 
    159    INTEGER, PARAMETER ::   jps_fice2  = 26   ! ice fraction sent to OPA (by SAS when doing SAS-OPA coupling) 
     159   INTEGER, PARAMETER ::   jps_fice2  = 26   ! ice fraction sent to OCE (by SAS when doing SAS-OCE coupling) 
    160160   INTEGER, PARAMETER ::   jps_e3t1st = 27   ! first level depth (vvl) 
    161161   INTEGER, PARAMETER ::   jps_fraqsr = 28   ! fraction of solar net radiation absorbed in the first ocean level 
     
    706706      ! 
    707707      !                                                      ! ------------------------------- ! 
    708       !                                                      !   OPA-SAS coupling - rcv by opa ! 
     708      !                                                      !   OCE-SAS coupling - rcv by opa ! 
    709709      !                                                      ! ------------------------------- ! 
    710710      srcv(jpr_sflx)%clname = 'O_SFLX' 
    711711      srcv(jpr_fice)%clname = 'RIceFrc' 
    712712      ! 
    713       IF( nn_components == jp_iam_opa ) THEN    ! OPA coupled to SAS via OASIS: force received field by OPA (sent by SAS) 
     713      IF( nn_components == jp_iam_oce ) THEN    ! OCE coupled to SAS via OASIS: force received field by OCE (sent by SAS) 
    714714         srcv(:)%laction = .FALSE.   ! force default definition in case of opa <-> sas coupling 
    715715         srcv(:)%clgrid  = 'T'       ! force default definition in case of opa <-> sas coupling 
     
    727727         IF(lwp) THEN                        ! control print 
    728728            WRITE(numout,*) 
    729             WRITE(numout,*)'               Special conditions for SAS-OPA coupling  ' 
    730             WRITE(numout,*)'               OPA component  ' 
     729            WRITE(numout,*)'               Special conditions for SAS-OCE coupling  ' 
     730            WRITE(numout,*)'               OCE component  ' 
    731731            WRITE(numout,*) 
    732732            WRITE(numout,*)'  received fields from SAS component ' 
     
    742742      ENDIF 
    743743      !                                                      ! -------------------------------- ! 
    744       !                                                      !   OPA-SAS coupling - rcv by sas  ! 
     744      !                                                      !   OCE-SAS coupling - rcv by sas  ! 
    745745      !                                                      ! -------------------------------- ! 
    746746      srcv(jpr_toce  )%clname = 'I_SSTSST' 
     
    762762         ! Vectors: change of sign at north fold ONLY if on the local grid 
    763763         srcv(jpr_ocx1:jpr_ocy1)%nsgn = -1. 
    764          ! Change first letter to couple with atmosphere if already coupled OPA 
     764         ! Change first letter to couple with atmosphere if already coupled OCE 
    765765         ! this is nedeed as each variable name used in the namcouple must be unique: 
    766          ! for example O_Runoff received by OPA from SAS and therefore S_Runoff received by SAS from the Atmosphere 
     766         ! for example O_Runoff received by OCE from SAS and therefore S_Runoff received by SAS from the Atmosphere 
    767767         DO jn = 1, jprcv 
    768768            IF( srcv(jn)%clname(1:1) == "O" ) srcv(jn)%clname = "S"//srcv(jn)%clname(2:LEN(srcv(jn)%clname)) 
     
    771771         IF(lwp) THEN                        ! control print 
    772772            WRITE(numout,*) 
    773             WRITE(numout,*)'               Special conditions for SAS-OPA coupling  ' 
     773            WRITE(numout,*)'               Special conditions for SAS-OCE coupling  ' 
    774774            WRITE(numout,*)'               SAS component  ' 
    775775            WRITE(numout,*) 
    776776            IF( .NOT. ln_cpl ) THEN 
    777                WRITE(numout,*)'  received fields from OPA component ' 
     777               WRITE(numout,*)'  received fields from OCE component ' 
    778778            ELSE 
    779                WRITE(numout,*)'  Additional received fields from OPA component : ' 
     779               WRITE(numout,*)'  Additional received fields from OCE component : ' 
    780780            ENDIF 
    781781            WRITE(numout,*)'               sea surface temperature (Celsius) ' 
     
    10281028 
    10291029      !                                                      ! ------------------------------- ! 
    1030       !                                                      !   OPA-SAS coupling - snd by opa ! 
     1030      !                                                      !   OCE-SAS coupling - snd by opa ! 
    10311031      !                                                      ! ------------------------------- ! 
    10321032      ssnd(jps_ssh   )%clname = 'O_SSHght' 
     
    10351035      ssnd(jps_fraqsr)%clname = 'O_FraQsr' 
    10361036      ! 
    1037       IF( nn_components == jp_iam_opa ) THEN 
     1037      IF( nn_components == jp_iam_oce ) THEN 
    10381038         ssnd(:)%laction = .FALSE.   ! force default definition in case of opa <-> sas coupling 
    10391039         ssnd( (/jps_toce, jps_soce, jps_ssh, jps_fraqsr, jps_ocx1, jps_ocy1/) )%laction = .TRUE. 
     
    10591059      ENDIF 
    10601060      !                                                      ! ------------------------------- ! 
    1061       !                                                      !   OPA-SAS coupling - snd by sas ! 
     1061      !                                                      !   OCE-SAS coupling - snd by sas ! 
    10621062      !                                                      ! ------------------------------- ! 
    10631063      ssnd(jps_sflx  )%clname = 'I_SFLX' 
     
    10771077         ! Change first letter to couple with atmosphere if already coupled with sea_ice 
    10781078         ! this is nedeed as each variable name used in the namcouple must be unique: 
    1079          ! for example O_SSTSST sent by OPA to SAS and therefore S_SSTSST sent by SAS to the Atmosphere 
     1079         ! for example O_SSTSST sent by OCE to SAS and therefore S_SSTSST sent by SAS to the Atmosphere 
    10801080         DO jn = 1, jpsnd 
    10811081            IF( ssnd(jn)%clname(1:1) == "O" ) ssnd(jn)%clname = "S"//ssnd(jn)%clname(2:LEN(ssnd(jn)%clname)) 
     
    10851085            WRITE(numout,*) 
    10861086            IF( .NOT. ln_cpl ) THEN 
    1087                WRITE(numout,*)'  sent fields to OPA component ' 
     1087               WRITE(numout,*)'  sent fields to OCE component ' 
    10881088            ELSE 
    1089                WRITE(numout,*)'  Additional sent fields to OPA component : ' 
     1089               WRITE(numout,*)'  Additional sent fields to OCE component : ' 
    10901090            ENDIF 
    10911091            WRITE(numout,*)'                  ice cover ' 
     
    15251525         ENDIF 
    15261526         ! update qns over the free ocean with: 
    1527          IF( nn_components /= jp_iam_opa ) THEN 
     1527         IF( nn_components /= jp_iam_oce ) THEN 
    15281528            zqns(:,:) =  zqns(:,:) - zemp(:,:) * sst_m(:,:) * rcp         ! remove heat content due to mass flux (assumed to be at SST) 
    15291529            IF( srcv(jpr_snow  )%laction ) THEN 
     
    22752275      IF( ssnd(jps_toce)%laction .OR. ssnd(jps_tice)%laction .OR. ssnd(jps_tmix)%laction ) THEN 
    22762276 
    2277          IF( nn_components == jp_iam_opa ) THEN 
     2277         IF( nn_components == jp_iam_oce ) THEN 
    22782278            ztmp1(:,:) = ts(:,:,1,jp_tem,Kmm)   ! send temperature as it is (potential or conservative) -> use of l_useCT on the received part 
    22792279         ELSE 
     
    24272427      ENDIF 
    24282428 
    2429       ! Send ice fraction field to OPA (sent by SAS in SAS-OPA coupling) 
     2429      ! Send ice fraction field to OCE (sent by SAS in SAS-OCE coupling) 
    24302430      IF( ssnd(jps_fice2)%laction ) THEN 
    24312431         ztmp3(:,:,1) = fr_i(:,:) 
     
    25432543         !                                                              i-1  i   i 
    25442544         !                                                               i      i+1 (for I) 
    2545          IF( nn_components == jp_iam_opa ) THEN 
     2545         IF( nn_components == jp_iam_oce ) THEN 
    25462546            zotx1(:,:) = uu(:,:,1,Kmm) 
    25472547            zoty1(:,:) = vv(:,:,1,Kmm) 
     
    27002700      ENDIF 
    27012701      ! 
    2702       !  Fields sent by OPA to SAS when doing OPA<->SAS coupling 
     2702      !  Fields sent by OCE to SAS when doing OCE<->SAS coupling 
    27032703      !                                                        ! SSH 
    27042704      IF( ssnd(jps_ssh )%laction )  THEN 
     
    27242724      ENDIF 
    27252725      ! 
    2726       !  Fields sent by SAS to OPA when OASIS coupling 
     2726      !  Fields sent by SAS to OCE when OASIS coupling 
    27272727      !                                                        ! Solar heat flux 
    27282728      IF( ssnd(jps_qsroce)%laction )  CALL cpl_snd( jps_qsroce, isec, RESHAPE ( qsr , (/jpi,jpj,1/) ), info ) 
  • NEMO/trunk/src/OCE/SBC/sbcmod.F90

    r14072 r14227  
    163163      !                       !**  check option consistency 
    164164      ! 
    165       IF(lwp) WRITE(numout,*)       !* Single / Multi - executable (NEMO / OPA+SAS) 
     165      IF(lwp) WRITE(numout,*)       !* Single / Multi - executable (NEMO / OCE+SAS) 
    166166      SELECT CASE( nn_components ) 
    167167      CASE( jp_iam_nemo ) 
    168          IF(lwp) WRITE(numout,*) '   ==>>>   NEMO configured as a single executable (i.e. including both OPA and Surface module)' 
    169       CASE( jp_iam_opa  ) 
    170          IF(lwp) WRITE(numout,*) '   ==>>>   Multi executable configuration. Here, OPA component' 
    171          IF( .NOT.lk_oasis )   CALL ctl_stop( 'sbc_init : OPA-SAS coupled via OASIS, but key_oasis3 disabled' ) 
    172          IF( ln_cpl        )   CALL ctl_stop( 'sbc_init : OPA-SAS coupled via OASIS, but ln_cpl = T in OPA'   ) 
    173          IF( ln_mixcpl     )   CALL ctl_stop( 'sbc_init : OPA-SAS coupled via OASIS, but ln_mixcpl = T in OPA' ) 
     168         IF(lwp) WRITE(numout,*) '   ==>>>   NEMO configured as a single executable (i.e. including both OCE and Surface module)' 
     169      CASE( jp_iam_oce  ) 
     170         IF(lwp) WRITE(numout,*) '   ==>>>   Multi executable configuration. Here, OCE component' 
     171         IF( .NOT.lk_oasis )   CALL ctl_stop( 'sbc_init : OCE-SAS coupled via OASIS, but key_oasis3 disabled' ) 
     172         IF( ln_cpl        )   CALL ctl_stop( 'sbc_init : OCE-SAS coupled via OASIS, but ln_cpl = T in OCE'   ) 
     173         IF( ln_mixcpl     )   CALL ctl_stop( 'sbc_init : OCE-SAS coupled via OASIS, but ln_mixcpl = T in OCE' ) 
    174174      CASE( jp_iam_sas  ) 
    175175         IF(lwp) WRITE(numout,*) '   ==>>>   Multi executable configuration. Here, SAS component' 
    176          IF( .NOT.lk_oasis )   CALL ctl_stop( 'sbc_init : OPA-SAS coupled via OASIS, but key_oasis3 disabled' ) 
    177          IF( ln_mixcpl     )   CALL ctl_stop( 'sbc_init : OPA-SAS coupled via OASIS, but ln_mixcpl = T in OPA' ) 
     176         IF( .NOT.lk_oasis )   CALL ctl_stop( 'sbc_init : OCE-SAS coupled via OASIS, but key_oasis3 disabled' ) 
     177         IF( ln_mixcpl     )   CALL ctl_stop( 'sbc_init : OCE-SAS coupled via OASIS, but ln_mixcpl = T in OCE' ) 
    178178      CASE DEFAULT 
    179179         CALL ctl_stop( 'sbc_init : unsupported value for nn_components' ) 
     
    224224      ! 
    225225      IF( nn_ice == 0 ) THEN        !* No sea-ice in the domain : ice fraction is always zero 
    226          IF( nn_components /= jp_iam_opa )   fr_i(:,:) = 0._wp    ! except for OPA in SAS-OPA coupled case 
     226         IF( nn_components /= jp_iam_oce )   fr_i(:,:) = 0._wp    ! except for OCE in SAS-OCE coupled case 
    227227      ENDIF 
    228228      ! 
     
    237237      IF( ln_dm2dc ) THEN           !* daily mean to diurnal cycle 
    238238         !LB:nday_qsr = -1   ! allow initialization at the 1st call 
    239          IF( .NOT.( ln_flx .OR. ln_blk .OR. ln_abl ) .AND. nn_components /= jp_iam_opa )   & 
     239         IF( .NOT.( ln_flx .OR. ln_blk .OR. ln_abl ) .AND. nn_components /= jp_iam_oce )   & 
    240240            &   CALL ctl_stop( 'qsr diurnal cycle from daily values requires flux, bulk or abl formulation' ) 
    241241      ENDIF 
     
    244244      ! 
    245245      ll_purecpl  = ln_cpl .AND. .NOT.ln_mixcpl 
    246       ll_opa      = nn_components == jp_iam_opa 
     246      ll_opa      = nn_components == jp_iam_oce 
    247247      ll_not_nemo = nn_components /= jp_iam_nemo 
    248248      icpt = 0 
     
    266266         CASE( jp_purecpl )   ;   WRITE(numout,*) '   ==>>>   pure coupled formulation' 
    267267!!gm abusive use of jp_none ??   ===>>> need to be check and changed by adding a jp_sas parameter 
    268          CASE( jp_none    )   ;   WRITE(numout,*) '   ==>>>   OPA coupled to SAS via oasis' 
     268         CASE( jp_none    )   ;   WRITE(numout,*) '   ==>>>   OCE coupled to SAS via oasis' 
    269269            IF( ln_mixcpl )       WRITE(numout,*) '               + forced-coupled mixed formulation' 
    270270         END SELECT 
     
    276276      IF( lk_oasis )   CALL sbc_cpl_init( nn_ice )   ! Must be done before: (1) first time step 
    277277      !                                              !                      (2) the use of nn_fsbc 
    278       !     nn_fsbc initialization if OPA-SAS coupling via OASIS 
     278      !     nn_fsbc initialization if OCE-SAS coupling via OASIS 
    279279      !     SAS time-step has to be declared in OASIS (mandatory) -> nn_fsbc has to be modified accordingly 
    280280      IF( nn_components /= jp_iam_nemo ) THEN 
    281          IF( nn_components == jp_iam_opa )   nn_fsbc = cpl_freq('O_SFLX') / NINT(rn_Dt) 
     281         IF( nn_components == jp_iam_oce )   nn_fsbc = cpl_freq('O_SFLX') / NINT(rn_Dt) 
    282282         IF( nn_components == jp_iam_sas )   nn_fsbc = cpl_freq('I_SFLX') / NINT(rn_Dt) 
    283283         ! 
    284284         IF(lwp)THEN 
    285285            WRITE(numout,*) 
    286             WRITE(numout,*)"   OPA-SAS coupled via OASIS : nn_fsbc re-defined from OASIS namcouple ", nn_fsbc 
     286            WRITE(numout,*)"   OCE-SAS coupled via OASIS : nn_fsbc re-defined from OASIS namcouple ", nn_fsbc 
    287287            WRITE(numout,*) 
    288288         ENDIF 
     
    404404      ! 
    405405      ll_sas = nn_components == jp_iam_sas               ! component flags 
    406       ll_opa = nn_components == jp_iam_opa 
     406      ll_opa = nn_components == jp_iam_oce 
    407407      ! 
    408408      IF( .NOT.ll_sas )   CALL sbc_ssm ( kt, Kbb, Kmm )  ! mean ocean sea surface variables (sst_m, sss_m, ssu_m, ssv_m) 
     
    416416      CASE( jp_flx     )   ;   CALL sbc_flx       ( kt )                             ! flux formulation 
    417417      CASE( jp_blk     ) 
    418          IF( ll_sas    )       CALL sbc_cpl_rcv   ( kt, nn_fsbc, nn_ice, Kbb, Kmm )   ! OPA-SAS coupling: SAS receiving fields from OPA 
     418         IF( ll_sas    )       CALL sbc_cpl_rcv   ( kt, nn_fsbc, nn_ice, Kbb, Kmm )   ! OCE-SAS coupling: SAS receiving fields from OCE 
    419419!!!!!!!!!!! ATTENTION:ln_wave is not only used for oasis coupling !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! 
    420420         IF( ln_wave )   THEN 
    421              IF ( lk_oasis )  CALL sbc_cpl_rcv ( kt, nn_fsbc, nn_ice, Kbb, Kmm )   ! OPA-wave coupling 
     421             IF ( lk_oasis )  CALL sbc_cpl_rcv ( kt, nn_fsbc, nn_ice, Kbb, Kmm )   ! OCE-wave coupling 
    422422             CALL sbc_wave ( kt, Kmm ) 
    423423         ENDIF 
     
    425425                               ! 
    426426      CASE( jp_abl     ) 
    427          IF( ll_sas    )       CALL sbc_cpl_rcv   ( kt, nn_fsbc, nn_ice, Kbb, Kmm )   ! OPA-SAS coupling: SAS receiving fields from OPA 
     427         IF( ll_sas    )       CALL sbc_cpl_rcv   ( kt, nn_fsbc, nn_ice, Kbb, Kmm )   ! OCE-SAS coupling: SAS receiving fields from OCE 
    428428                               CALL sbc_abl       ( kt )                    ! ABL  formulation for the ocean 
    429429                               ! 
    430430      CASE( jp_purecpl )   ;   CALL sbc_cpl_rcv   ( kt, nn_fsbc, nn_ice, Kbb, Kmm )   ! pure coupled formulation 
    431431      CASE( jp_none    ) 
    432          IF( ll_opa    )       CALL sbc_cpl_rcv   ( kt, nn_fsbc, nn_ice, Kbb, Kmm )  ! OPA-SAS coupling: OPA receiving fields from SAS 
     432         IF( ll_opa    )       CALL sbc_cpl_rcv   ( kt, nn_fsbc, nn_ice, Kbb, Kmm )  ! OCE-SAS coupling: OCE receiving fields from SAS 
    433433      END SELECT 
    434434      ! 
  • NEMO/trunk/src/OCE/lib_cray.f90

    r10070 r14227  
    1 !  Cray subroutines or functions used by OPA model and possibly  
     1!  Cray subroutines or functions used by OCE model and possibly  
    22!  not found on other platforms. 
    33! 
  • NEMO/trunk/src/OCE/nemogcm.F90

    r14143 r14227  
    589589      !!                     ***  ROUTINE nemo_alloc  *** 
    590590      !! 
    591       !! ** Purpose :   Allocate all the dynamic arrays of the OPA modules 
     591      !! ** Purpose :   Allocate all the dynamic arrays of the OCE modules 
    592592      !! 
    593593      !! ** Method  : 
  • NEMO/trunk/src/OCE/step.F90

    r14203 r14227  
    4242#else 
    4343   !!---------------------------------------------------------------------- 
    44    !!   stp             : OPA system time-stepping 
     44   !!   stp             : OCE system time-stepping 
    4545   !!---------------------------------------------------------------------- 
    4646   USE step_oce         ! time stepping definition modules 
     
    7373      !!                     ***  ROUTINE stp  *** 
    7474      !! 
    75       !! ** Purpose : - Time stepping of OPA  (momentum and active tracer eqs.) 
     75      !! ** Purpose : - Time stepping of OCE  (momentum and active tracer eqs.) 
    7676      !!              - Time stepping of SI3 (dynamic and thermodynamic eqs.) 
    7777      !!              - Time stepping of TRC  (passive tracer eqs.) 
  • NEMO/trunk/src/OCE/stpmlf.F90

    r14205 r14227  
    8080      !!                     ***  ROUTINE stp_MLF  *** 
    8181      !! 
    82       !! ** Purpose : - Time stepping of OPA  (momentum and active tracer eqs.) 
     82      !! ** Purpose : - Time stepping of OCE  (momentum and active tracer eqs.) 
    8383      !!              - Time stepping of SI3 (dynamic and thermodynamic eqs.) 
    8484      !!              - Time stepping of TRC  (passive tracer eqs.) 
  • NEMO/trunk/src/OFF/nemogcm.F90

    r14053 r14227  
    456456      !!                     ***  ROUTINE nemo_alloc  *** 
    457457      !! 
    458       !! ** Purpose :   Allocate all the dynamic arrays of the OPA modules 
     458      !! ** Purpose :   Allocate all the dynamic arrays of the OCE modules 
    459459      !! 
    460460      !! ** Method  : 
  • NEMO/trunk/src/SAO/nemogcm.F90

    r13970 r14227  
    323323      !!                     ***  ROUTINE nemo_alloc  *** 
    324324      !! 
    325       !! ** Purpose :   Allocate all the dynamic arrays of the OPA modules 
     325      !! ** Purpose :   Allocate all the dynamic arrays of the OCE modules 
    326326      !! 
    327327      !! ** Method  : 
  • NEMO/trunk/src/SAS/nemogcm.F90

    r14053 r14227  
    391391 
    392392      ! ==> clem: open boundaries init. is mandatory for sea-ice because ice BDY is not decoupled from   
    393       !           the environment of ocean BDY. Therefore bdy is called in both OPA and SAS modules.  
     393      !           the environment of ocean BDY. Therefore bdy is called in both OCE and SAS modules.  
    394394      !           This is not clean and should be changed in the future.  
    395395                           CALL bdy_init 
     
    489489      !!                     ***  ROUTINE nemo_alloc  *** 
    490490      !! 
    491       !! ** Purpose :   Allocate all the dynamic arrays of the OPA modules 
     491      !! ** Purpose :   Allocate all the dynamic arrays of the OCE modules 
    492492      !! 
    493493      !! ** Method  : 
  • NEMO/trunk/src/SAS/step.F90

    r13970 r14227  
    1212 
    1313   !!---------------------------------------------------------------------- 
    14    !!   stp             : OPA system time-stepping 
     14   !!   stp             : OCE system time-stepping 
    1515   !!---------------------------------------------------------------------- 
    1616   USE oce              ! ocean dynamics and tracers variables 
     
    111111 
    112112      ! ==> clem: open boundaries is mandatory for sea-ice because ice BDY is not decoupled from   
    113       !           the environment of ocean BDY. Therefore bdy is called in both OPA and SAS modules. 
     113      !           the environment of ocean BDY. Therefore bdy is called in both OCE and SAS modules. 
    114114      !           From SAS: ocean bdy data are wrong  (but we do not care) and ice bdy data are OK.   
    115115      !           This is not clean and should be changed in the future.  
  • NEMO/trunk/src/SWE/nemogcm.F90

    r14137 r14227  
    413413      !!                     ***  ROUTINE nemo_alloc  *** 
    414414      !! 
    415       !! ** Purpose :   Allocate all the dynamic arrays of the OPA modules 
     415      !! ** Purpose :   Allocate all the dynamic arrays of the OCE modules 
    416416      !! 
    417417      !! ** Method  : 
  • NEMO/trunk/src/TOP/trcini.F90

    r14086 r14227  
    209209      !!                     ***  ROUTINE trc_ini_trp  *** 
    210210      !! 
    211       !! ** Purpose :   Allocate all the dynamic arrays of the OPA modules 
     211      !! ** Purpose :   Allocate all the dynamic arrays of the OCE modules 
    212212      !!---------------------------------------------------------------------- 
    213213      USE trcdmp , ONLY:  trc_dmp_ini 
     
    281281      !!                     ***  ROUTINE top_alloc  *** 
    282282      !! 
    283       !! ** Purpose :   Allocate all the dynamic arrays of the OPA modules 
     283      !! ** Purpose :   Allocate all the dynamic arrays of the OCE modules 
    284284      !!---------------------------------------------------------------------- 
    285285      USE trc           , ONLY:   trc_alloc 
  • NEMO/trunk/tests/ICB/MY_SRC/step.F90

    r13899 r14227  
    3939#else 
    4040   !!---------------------------------------------------------------------- 
    41    !!   stp             : OPA system time-stepping 
     41   !!   stp             : OCE system time-stepping 
    4242   !!---------------------------------------------------------------------- 
    4343   USE step_oce         ! time stepping definition modules 
     
    7272      !!                     ***  ROUTINE stp  *** 
    7373      !! 
    74       !! ** Purpose : - Time stepping of OPA  (momentum and active tracer eqs.) 
     74      !! ** Purpose : - Time stepping of OCE  (momentum and active tracer eqs.) 
    7575      !!              - Time stepping of SI3 (dynamic and thermodynamic eqs.) 
    7676      !!              - Time stepping of TRC  (passive tracer eqs.) 
  • NEMO/trunk/tests/STATION_ASF/MY_SRC/nemogcm.F90

    r14072 r14227  
    373373      !!                     ***  ROUTINE nemo_alloc  *** 
    374374      !! 
    375       !! ** Purpose :   Allocate all the dynamic arrays of the OPA modules 
     375      !! ** Purpose :   Allocate all the dynamic arrays of the OCE modules 
    376376      !! 
    377377      !! ** Method  : 
  • NEMO/trunk/tests/STATION_ASF/MY_SRC/step_c1d.F90

    r14072 r14227  
    3636      !! 
    3737      !! ** Purpose :  - Time stepping of SBC including sea ice (dynamic and thermodynamic eqs.) 
    38       !!               - Time stepping of OPA (momentum and active tracer eqs.) 
     38      !!               - Time stepping of OCE (momentum and active tracer eqs.) 
    3939      !!               - Time stepping of TOP (passive tracer eqs.) 
    4040      !! 
Note: See TracChangeset for help on using the changeset viewer.