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 12943 for NEMO/branches/UKMO – NEMO

Changeset 12943 for NEMO/branches/UKMO


Ignore:
Timestamp:
2020-05-18T13:28:54+02:00 (4 years ago)
Author:
hadcv
Message:

Merge changes from dev_r12866_HPC-02_Daley_Tiling_trial_extra_halo

Location:
NEMO/branches/UKMO/dev_r12745_HPC-02_Daley_Tiling_trial_public/src/OCE
Files:
4 edited

Legend:

Unmodified
Added
Removed
  • NEMO/branches/UKMO/dev_r12745_HPC-02_Daley_Tiling_trial_public/src/OCE/IOM/prtctl.F90

    r12377 r12943  
    9494      REAL(wp), DIMENSION(jpi,jpj,jpk) :: zmask1, zmask2, ztab3d_1, ztab3d_2 
    9595      !!---------------------------------------------------------------------- 
     96      ! TODO: TO BE TILED 
     97      IF( ntile /= 0 .AND. ntile /= nijtile ) RETURN 
    9698 
    9799      ! Arrays, scalars initialization  
  • NEMO/branches/UKMO/dev_r12745_HPC-02_Daley_Tiling_trial_public/src/OCE/TRA/traldf.F90

    r12879 r12943  
    5858      !!---------------------------------------------------------------------- 
    5959      ! 
    60       IF( ntile == 1 )  THEN                      ! Do only on the first tile 
    61          ! TODO: TO BE TILED 
    6260         IF( ln_timing )   CALL timing_start('tra_ldf') 
    63       ENDIF 
    6461      ! 
    65       IF( ntile == nijtile )  THEN                ! Do only after all tiles finish 
     62      IF( ntile == 0 .OR. ntile == nijtile )  THEN                ! Do only after all tiles finish 
    6663         IF( l_trdtra )   THEN                    !* Save ta and sa trends 
    6764            ! TODO: TO BE TILED 
     
    8380      END SELECT 
    8481      ! 
    85       IF( ntile == nijtile )  THEN                ! Do only after all tiles finish 
     82      IF( ntile == 0 .OR. ntile == nijtile )  THEN                ! Do only after all tiles finish 
    8683         IF( l_trdtra )   THEN                    !* save the horizontal diffusive trends for further diagnostics 
    8784            ! TODO: TO BE TILED 
     
    9390            DEALLOCATE( ztrdt, ztrds ) 
    9491         ENDIF 
    95  
     92      ENDIF 
    9693         !                                        !* print mean trends (used for debugging) 
    97          ! TODO: TO BE TILED 
    9894         IF(sn_cfctl%l_prtctl)   CALL prt_ctl( tab3d_1=pts(:,:,:,jp_tem,Krhs), clinfo1=' ldf  - Ta: ', mask1=tmask,               & 
    9995            &                                  tab3d_2=pts(:,:,:,jp_sal,Krhs), clinfo2=       ' Sa: ', mask2=tmask, clinfo3='tra' ) 
    10096         ! 
    101          ! TODO: TO BE TILED 
    10297         IF( ln_timing )   CALL timing_stop('tra_ldf') 
    103       ENDIF 
    10498      ! 
    10599   END SUBROUTINE tra_ldf 
  • NEMO/branches/UKMO/dev_r12745_HPC-02_Daley_Tiling_trial_public/src/OCE/TRA/traldf_iso.F90

    r12879 r12943  
    114114      ! 
    115115      IF( kpass == 1 .AND. kt == kit000 )  THEN 
    116          IF( ntile == 1 )  THEN                       ! Do only on the first tile 
     116         IF( ntile == 0 .OR. ntile == 1 )  THEN                       ! Do only on the first tile 
    117117            ! TODO: TO BE TILED 
    118118            IF(lwp) WRITE(numout,*) 
     
    197197         !!---------------------------------------------------------------------- 
    198198!!gm : bug.... why (x,:,:)?   (1,jpj,:) and (jpi,1,:) should be sufficient.... 
    199          zdit (1,:,:) = 0._wp     ;     zdit (jpi,:,:) = 0._wp 
    200          zdjt (1,:,:) = 0._wp     ;     zdjt (jpi,:,:) = 0._wp 
     199         zdit (Ntis2,:,:) = 0._wp     ;     zdit (Ntie2,:,:) = 0._wp 
     200         zdjt (Ntis2,:,:) = 0._wp     ;     zdjt (Ntie2,:,:) = 0._wp 
    201201         !!end 
    202202 
     
    321321         END_3D 
    322322         ! 
    323          IF( ntile == nijtile )  THEN                          ! Do only after all tiles finish 
    324323            IF( ( kpass == 1 .AND. ln_traldf_lap ) .OR.  &     !==  first pass only (  laplacian)  ==! 
    325324                ( kpass == 2 .AND. ln_traldf_blp ) ) THEN      !==  2nd   pass      (bilaplacian)  ==! 
     
    334333               ! 
    335334            ENDIF                                                    !== end pass selection  ==! 
    336          ENDIF 
    337335         ! 
    338336         !                                                        ! =============== 
  • NEMO/branches/UKMO/dev_r12745_HPC-02_Daley_Tiling_trial_public/src/OCE/timing.F90

    r12489 r12943  
    9393      !!---------------------------------------------------------------------- 
    9494      CHARACTER(len=*), INTENT(in) :: cdinfo 
     95      ! TODO: TO BE TILED 
     96      IF( ntile /= 0 .AND. ntile /= 1 ) RETURN 
    9597      ! 
    9698       IF(ASSOCIATED(s_timer) ) s_timer_old => s_timer 
     
    138140      INTEGER  :: ifinal_count, iperiods     
    139141      REAL(wp) :: zcpu_end, zmpitime,zcpu_raw,zclock_raw 
     142      ! TODO: TO BE TILED 
     143      IF( ntile /= 0 .AND. ntile /= nijtile ) RETURN 
    140144      ! 
    141145      s_wrk => NULL() 
Note: See TracChangeset for help on using the changeset viewer.