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 2487 for branches – NEMO

Changeset 2487 for branches


Ignore:
Timestamp:
2010-12-19T16:07:50+01:00 (13 years ago)
Author:
rblod
Message:

Correct Agrif inconstency for ssh, nemo_v3_3_beta version, see ticket #669

Location:
branches/nemo_v3_3_beta/NEMOGCM/NEMO
Files:
4 edited

Legend:

Unmodified
Added
Removed
  • branches/nemo_v3_3_beta/NEMOGCM/NEMO/NST_SRC/agrif_opa_interp.F90

    r2342 r2487  
    2929   PRIVATE 
    3030     
    31    PUBLIC   Agrif_tra, Agrif_dyn, interpu, interpv 
     31   PUBLIC   Agrif_tra, Agrif_dyn, Agrif_ssh, interpu, interpv 
    3232 
    3333#  include "domzgr_substitute.h90"   
     
    278278         END DO 
    279279 
    280          sshn(2,:)=sshn(3,:) 
    281          sshb(2,:)=sshb(3,:) 
    282  
    283280      ENDIF 
    284281 
     
    355352         END DO 
    356353 
    357          sshn(nlci-1,:)=sshn(nlci-2,:) 
    358          sshb(nlci-1,:)=sshb(nlci-2,:)         
    359354      ENDIF 
    360355 
     
    426421         END DO 
    427422 
    428          sshn(:,2)=sshn(:,3) 
    429          sshb(:,2)=sshb(:,3) 
    430423      ENDIF 
    431424 
     
    498491         END DO 
    499492 
    500          sshn(:,nlcj-1)=sshn(:,nlcj-2) 
    501          sshb(:,nlcj-1)=sshb(:,nlcj-2)                 
    502493      ENDIF 
    503494 
    504495   END SUBROUTINE Agrif_dyn 
     496 
     497 
     498   SUBROUTINE Agrif_ssh( kt ) 
     499      !!---------------------------------------------------------------------- 
     500      !!                  ***  ROUTINE Agrif_DYN  *** 
     501      !!----------------------------------------------------------------------   
     502      INTEGER, INTENT(in) ::   kt 
     503      !! 
     504      !!----------------------------------------------------------------------   
     505 
     506      IF( Agrif_Root() )   RETURN 
     507 
     508 
     509      IF((nbondi == -1).OR.(nbondi == 2)) THEN 
     510         ssha(2,:)=ssha(3,:) 
     511         sshn(2,:)=sshn(3,:) 
     512      ENDIF 
     513 
     514      IF((nbondi == 1).OR.(nbondi == 2)) THEN 
     515         ssha(nlci-1,:)=ssha(nlci-2,:) 
     516         sshn(nlci-1,:)=sshn(nlci-2,:)         
     517      ENDIF 
     518 
     519      IF((nbondj == -1).OR.(nbondj == 2)) THEN 
     520         ssha(:,2)=sshn(:,3) 
     521         sshn(:,2)=sshb(:,3) 
     522      ENDIF 
     523 
     524      IF((nbondj == 1).OR.(nbondj == 2)) THEN 
     525         ssha(:,nlcj-1)=ssha(:,nlcj-2) 
     526         ssha(:,nlcj-1)=sshn(:,nlcj-2)                 
     527      ENDIF 
     528 
     529   END SUBROUTINE Agrif_ssh 
    505530 
    506531 
  • branches/nemo_v3_3_beta/NEMOGCM/NEMO/NST_SRC/agrif_opa_update.F90

    r2393 r2487  
    9393      !!   *** ROUTINE recompute_diags *** 
    9494      !!--------------------------------------------- 
    95       USE divcur 
    96       USE sshwzv 
    97 !      USE cla 
    98  
    9995      INTEGER, INTENT(in) :: kt 
    100  
    101       ta = hdivb 
    102       sa = rotb 
    103       Call div_cur(kt) 
    104  
    105       hdivb = ta 
    106       rotb  = sa 
    107  
    108 !      IF( n_cla == 1 ) CALL div_cla( kt ) 
    109 !      CALL wzv( kt ) 
    11096 
    11197   END SUBROUTINE recompute_diags 
  • branches/nemo_v3_3_beta/NEMOGCM/NEMO/OPA_SRC/DYN/dynnxt.F90

    r2287 r2487  
    3939   USE prtctl          ! Print control 
    4040#if defined key_agrif 
    41    USE agrif_opa_update 
    4241   USE agrif_opa_interp 
    4342#endif 
     
    316315      ENDIF 
    317316 
    318 #if defined key_agrif 
    319       ! Update velocity at AGRIF zoom boundaries 
    320       IF (.NOT.Agrif_Root())    CALL Agrif_Update_Dyn( kt ) 
    321 #endif       
    322  
    323317      IF(ln_ctl)   CALL prt_ctl( tab3d_1=un, clinfo1=' nxt  - Un: ', mask1=umask,   & 
    324318         &                       tab3d_2=vn, clinfo2=' Vn: '       , mask2=vmask ) 
  • branches/nemo_v3_3_beta/NEMOGCM/NEMO/OPA_SRC/DYN/sshwzv.F90

    r2392 r2487  
    3131   USE iom 
    3232   USE sbcrnf, ONLY  : h_rnf, nk_rnf  ! River runoff  
     33#if defined key_agrif 
     34   USE agrif_opa_update 
     35   USE agrif_opa_interp 
     36#endif 
    3337#if defined key_asminc    
    3438   USE asminc          ! Assimilation increment 
     
    165169      &                      * tmask(:,:,1) 
    166170 
     171#if defined key_agrif 
     172      CALL agrif_ssh(kt) 
     173#endif 
    167174#if defined key_obc 
    168175      IF( Agrif_Root() ) THEN  
     
    341348      ENDIF 
    342349      ! 
     350      ! Update velocity at AGRIF zoom boundaries 
     351#id defined key_agrif 
     352      IF ( .NOT.Agrif_Root() ) CALL Agrif_Update_Dyn( kt ) 
     353#endif 
     354      ! 
    343355      IF(ln_ctl)   CALL prt_ctl( tab2d_1=sshb, clinfo1=' sshb  - : ', mask1=tmask, ovlap=1 ) 
    344356      ! 
Note: See TracChangeset for help on using the changeset viewer.