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 2358 – NEMO

Changeset 2358


Ignore:
Timestamp:
2010-11-04T19:14:01+01:00 (13 years ago)
Author:
rblod
Message:

Changes to be able to compile v3_3_beta with key_agrif,see ticket #753 ; just compilation fixes, I was to scared to try to run AGRIF

Location:
branches/nemo_v3_3_beta/NEMOGCM/NEMO/OPA_SRC
Files:
8 edited
1 moved

Legend:

Unmodified
Added
Removed
  • branches/nemo_v3_3_beta/NEMOGCM/NEMO/OPA_SRC/OBS/diaobs.F90

    r2287 r2358  
    194194      INTEGER :: jset 
    195195      LOGICAL :: lmask(MaxNumFiles), ll_u3d, ll_v3d 
     196 
     197      !----------------------------------------------------------------------- 
     198      ! Force exit if AGRIF activated 
     199      !----------------------------------------------------------------------- 
     200     
     201      IF( lk_agrif ) THEN 
     202        CALL ctl_stop( 'dia_obs_init : key_diaobs and key_agrif cannot be used together' ) 
     203      ENDIF 
    196204 
    197205      !----------------------------------------------------------------------- 
  • branches/nemo_v3_3_beta/NEMOGCM/NEMO/OPA_SRC/OBS/obs_grd_bruteforce.h90

    r2267 r2358  
    1    SUBROUTINE obs_grid_search_bruteforce( kpi, kpj, kpiglo, kpjglo,       & 
    2       &                                   kldi, klei, kldj, klej,         & 
    3       &                                   kmyproc, ktotproc,              & 
    4       &                                   pglam, pgphi, pmask,            & 
    5       &                                   kobs, plam, pphi, kobsi, kobsj, & 
     1   SUBROUTINE obs_grd_bruteforce( kpi, kpj, kpiglo, kpjglo,       & 
     2      &                            kldi, klei, kldj, klej,         & 
     3      &                            kmyproc, ktotproc,              & 
     4      &                            pglam, pgphi, pmask,            & 
     5      &                            kobs, plam, pphi, kobsi, kobsj, & 
    66      &                                   kproc) 
    77      !!---------------------------------------------------------------------- 
    8       !!                ***  ROUTINE obs_grid_search_bruteforce *** 
     8      !!                ***  ROUTINE obs_grd_bruteforce *** 
    99      !! 
    1010      !! ** Purpose : Search gridpoints to find the grid box containing 
     
    347347         & ) 
    348348 
    349    END SUBROUTINE obs_grid_search_bruteforce 
     349   END SUBROUTINE obs_grd_bruteforce 
  • branches/nemo_v3_3_beta/NEMOGCM/NEMO/OPA_SRC/OBS/obs_grid.F90

    r2287 r2358  
    4444   PRIVATE linquad,                    & ! Determine whether a point lies within a cell 
    4545      &    maxdist,                    & ! Find the maximum distance between 2 pts in a cell 
    46       &    obs_grid_search_bruteforce, & ! Find i, j on the ORCA grid from lat, lon 
    47       &    obs_grid_search_lookup        ! Find i, j on the ORCA grid from lat, lon quicker 
     46      &    obs_grd_bruteforce, & ! Find i, j on the ORCA grid from lat, lon 
     47      &    obs_grd_lookup        ! Find i, j on the ORCA grid from lat, lon quicker 
    4848 
    4949   !!* Module variables 
     
    7575      & ixpos, & 
    7676      & iypos, & 
    77       & iproc     
     77      & iprocn     
    7878 
    7979   ! Switches 
     
    9898      !! ** Purpose : Search local gridpoints to find the grid box containing 
    9999      !!              the observations calls either 
    100       !!              obs_grid_search_bruteforce - the original brute force search 
     100      !!              obs_grd_bruteforce - the original brute force search 
    101101      !!                     or 
    102       !!              obs_grid_search_lookup - uses a lookup table to do a fast  
     102      !!              obs_grd_lookup - uses a lookup table to do a fast  
    103103      !!search 
    104104      !!History : 
     
    122122 
    123123         IF ( ln_grid_search_lookup .AND. ( cdgrid == 'T' ) ) THEN 
    124             CALL obs_grid_search_lookup( kobsin, plam, pphi, & 
     124            CALL obs_grd_lookup( kobsin, plam, pphi, & 
    125125               &                         kobsi, kobsj, kproc ) 
    126126         ELSE 
    127127            IF ( cdgrid == 'T' ) THEN 
    128                CALL obs_grid_search_bruteforce( jpi, jpj, jpiglo, jpjglo, & 
     128               CALL obs_grd_bruteforce( jpi, jpj, jpiglo, jpjglo, & 
    129129                  &                             nldi, nlei,nldj,  nlej,   & 
    130130                  &                             nproc, jpnij,             & 
     
    133133                  &                             kobsi, kobsj, kproc ) 
    134134            ELSEIF ( cdgrid == 'U' ) THEN 
    135                CALL obs_grid_search_bruteforce( jpi, jpj, jpiglo, jpjglo, & 
     135               CALL obs_grd_bruteforce( jpi, jpj, jpiglo, jpjglo, & 
    136136                  &                             nldi, nlei,nldj,  nlej,   & 
    137137                  &                             nproc, jpnij,             & 
     
    140140                  &                             kobsi, kobsj, kproc ) 
    141141            ELSEIF ( cdgrid == 'V' ) THEN 
    142                CALL obs_grid_search_bruteforce( jpi, jpj, jpiglo, jpjglo, & 
     142               CALL obs_grd_bruteforce( jpi, jpj, jpiglo, jpjglo, & 
    143143                  &                             nldi, nlei,nldj,  nlej,   & 
    144144                  &                             nproc, jpnij,             & 
     
    147147                  &                             kobsi, kobsj, kproc ) 
    148148            ELSEIF ( cdgrid == 'F' ) THEN 
    149                CALL obs_grid_search_bruteforce( jpi, jpj, jpiglo, jpjglo, & 
     149               CALL obs_grd_bruteforce( jpi, jpj, jpiglo, jpjglo, & 
    150150                  &                             nldi, nlei,nldj,  nlej,   & 
    151151                  &                             nproc, jpnij,             & 
     
    162162   END SUBROUTINE obs_grid_search 
    163163 
    164 #include "obs_grid_search_bruteforce.h90" 
     164#include "obs_grd_bruteforce.h90" 
    165165    
    166    SUBROUTINE obs_grid_search_lookup( kobs, plam, pphi, kobsi, kobsj, kproc ) 
     166   SUBROUTINE obs_grd_lookup( kobs, plam, pphi, kobsi, kobsj, kproc ) 
    167167      !!---------------------------------------------------------------------- 
    168       !!                ***  ROUTINE obs_grid_search_lookup *** 
     168      !!                ***  ROUTINE obs_grid_lookup *** 
    169169      !! 
    170170      !! ** Purpose : Search local gridpoints to find the grid box containing 
    171       !!              the observations (much faster then obs_grid_search_bruteforce) 
     171      !!              the observations (much faster then obs_grd_bruteforce) 
    172172      !! 
    173173      !! ** Method  : Call to linquad 
     
    361361      END DO 
    362362 
    363       if(lwp) WRITE(numout,*) 'obs_grid_search_lookup do coordinate search using lookup table' 
     363      if(lwp) WRITE(numout,*) 'obs_grid_lookup do coordinate search using lookup table' 
    364364 
    365365      !----------------------------------------------------------------------- 
     
    630630         & ) 
    631631       
    632    END SUBROUTINE obs_grid_search_lookup 
     632   END SUBROUTINE obs_grd_lookup 
    633633 
    634634 
     
    758758               & ixpos(nlons,nlats), & 
    759759               & iypos(nlons,nlats), & 
    760                & iproc(nlons,nlats)  & 
     760               & iprocn(nlons,nlats)  & 
    761761               & ) 
    762762             
     
    818818            END DO 
    819819             
    820             CALL obs_grid_search_bruteforce( jpi, jpj, jpiglo, jpjglo,  & 
    821                &                             nldi, nlei,nldj,  nlej,    & 
    822                &                             nproc, jpnij,              & 
    823                &                             glamt, gphit, tmask,       & 
    824                &                             nlons*nlats, lonsi, latsi, & 
    825                &                             ixposi, iyposi, iproci ) 
     820            CALL obs_grd_bruteforce( jpi, jpj, jpiglo, jpjglo,  & 
     821               &                     nldi, nlei,nldj,  nlej,    & 
     822               &                     nproc, jpnij,              & 
     823               &                     glamt, gphit, tmask,       & 
     824               &                     nlons*nlats, lonsi, latsi, & 
     825               &                     ixposi, iyposi, iproci ) 
    826826             
    827827            ! minimise file size by removing regions with no data from xypos file 
     
    873873               & ixpos(nlons,nlats),   & 
    874874               & iypos(nlons,nlats),   & 
    875                & iproc(nlons,nlats)    & 
     875               & iprocn(nlons,nlats)    & 
    876876               & ) 
    877877 
     
    880880            ixpos(:,:) = ixposi(jimin:jimax,jjmin:jjmax) 
    881881            iypos(:,:) = iyposi(jimin:jimax,jjmin:jjmax) 
    882             iproc(:,:) = iproci(jimin:jimax,jjmin:jjmax) 
     882            iprocn(:,:) = iproci(jimin:jimax,jjmin:jjmax) 
    883883 
    884884            DEALLOCATE(lonsi,latsi,ixposi,iyposi,iproci) 
     
    11691169 
    11701170      IF (ln_grid_search_lookup) THEN 
    1171          DEALLOCATE( lons, lats, ixpos, iypos, iproc ) 
     1171         DEALLOCATE( lons, lats, ixpos, iypos, iprocn ) 
    11721172      ENDIF 
    11731173       
  • branches/nemo_v3_3_beta/NEMOGCM/NEMO/OPA_SRC/OBS/obs_profiles.F90

    r2287 r2358  
    2929   INTEGER :: nprofvars                    ! Total number of variables for profiles 
    3030   INTEGER :: nprofextr                    ! Extra fields for each variable 
     31!$AGRIF_DO_NOT_TREAT 
    3132   TYPE(obs_prof), POINTER ::  profdata(:) ! Initial profile data 
    3233   TYPE(obs_prof), POINTER ::  prodatqc(:) ! Profile data after quality control 
     34!$AGRIF_END_DO_NOT_TREAT 
    3335 
    3436   INTEGER :: nvelosets                     ! Total number of velocity profile data sets 
    3537   INTEGER :: nvelovars                     ! Total number of variables for profiles 
    3638   INTEGER :: nveloextr                     ! Extra fields for each variable 
     39!$AGRIF_DO_NOT_TREAT 
    3740   TYPE(obs_prof), POINTER ::  velodata(:)  ! Initial velocity profile data 
    3841   TYPE(obs_prof), POINTER ::  veldatqc(:)  ! Velocity profile data after quality control 
     42!$AGRIF_END_DO_NOT_TREAT 
    3943END MODULE obs_profiles 
  • branches/nemo_v3_3_beta/NEMOGCM/NEMO/OPA_SRC/OBS/obs_seaice.F90

    r2287 r2358  
    2929                                                     ! variables 
    3030   INTEGER :: nseaicesets                               ! Number of seaicedata sets 
     31!$AGRIF_DO_NOT_TREAT 
    3132   TYPE(obs_surf), POINTER, DIMENSION(:) :: seaicedata  ! Initial sea ice data 
    3233   TYPE(obs_surf), POINTER, DIMENSION(:) :: seaicedatqc ! Sea ice data after quality control 
     34!$AGRIF_END_DO_NOT_TREAT 
    3335 
    3436END MODULE obs_seaice 
  • branches/nemo_v3_3_beta/NEMOGCM/NEMO/OPA_SRC/OBS/obs_sla.F90

    r2287 r2358  
    2828                                                     ! variables 
    2929   INTEGER :: nslasets                               ! Number of sladata sets                                                
     30!$AGRIF_DO_NOT_TREAT 
    3031   TYPE(obs_surf), POINTER, DIMENSION(:) :: sladata  ! Initial SLA data 
    3132   TYPE(obs_surf), POINTER, DIMENSION(:) :: sladatqc ! SLA data after quality control 
     33!$AGRIF_END_DO_NOT_TREAT 
    3234 
    3335END MODULE obs_sla 
  • branches/nemo_v3_3_beta/NEMOGCM/NEMO/OPA_SRC/OBS/obs_sst.F90

    r2287 r2358  
    2929                                                     ! variables 
    3030   INTEGER :: nsstsets                               ! Number of sstdata sets 
     31!$AGRIF_DO_NOT_TREAT 
    3132   TYPE(obs_surf), POINTER, DIMENSION(:) :: sstdata  ! Initial SST data 
    3233   TYPE(obs_surf), POINTER, DIMENSION(:) :: sstdatqc ! SST data after quality control 
     34!$AGRIF_END_DO_NOT_TREAT 
    3335 
    3436END MODULE obs_sst 
  • branches/nemo_v3_3_beta/NEMOGCM/NEMO/OPA_SRC/OBS/obs_types.F90

    r2287 r2358  
    3636 
    3737   INTEGER, PUBLIC, PARAMETER :: ntyp1770 = 1023 
    38    CHARACTER(LEN=4), PUBLIC, DIMENSION(0:ntyp1770) :: cwmotyp1770 
     38!RBbug useless ?   CHARACTER(LEN=4), PUBLIC, DIMENSION(0:ntyp1770) :: cwmotyp1770 
    3939   CHARACTER(LEN=80), PUBLIC, DIMENSION(0:ntyp1770) :: cwmonam1770 
    4040   CHARACTER(LEN=3), PUBLIC, DIMENSION(0:ntyp1770) :: ctypshort 
     
    119119         ctypshort(ji) = 'XBT' 
    120120 
    121          IF ( ji < 1000 ) THEN 
    122             WRITE(cwmotyp1770(ji),'(1X,I3.3)') ji 
    123          ELSE 
    124             WRITE(cwmotyp1770(ji),'(I4.4)') ji 
    125          ENDIF 
     121!         IF ( ji < 1000 ) THEN 
     122!            WRITE(cwmotyp1770(ji),'(1X,I3.3)') ji 
     123!         ELSE 
     124!            WRITE(cwmotyp1770(ji),'(I4.4)') ji 
     125!         ENDIF 
    126126 
    127127      END DO 
  • branches/nemo_v3_3_beta/NEMOGCM/NEMO/OPA_SRC/SBC/fldread.F90

    r2353 r2358  
    576576            ELSE                      ;   CALL iom_get( sdjf%num, jpdom_data, sdjf%clvar, sdjf%fnow(:,:,1  ), sdjf%nrec_a(1) ) 
    577577            ENDIF 
    578          CASE(jpk) 
     578         CASE DEFAULT 
    579579            IF( sdjf%ln_tint ) THEN   ;   CALL iom_get( sdjf%num, jpdom_data, sdjf%clvar, sdjf%fdta(:,:,:,2), sdjf%nrec_a(1) ) 
    580580            ELSE                      ;   CALL iom_get( sdjf%num, jpdom_data, sdjf%clvar, sdjf%fnow(:,:,:  ), sdjf%nrec_a(1) ) 
     
    995995      CASE(1) 
    996996           CALL iom_get( num, jpdom_unknown, clvar, ref_wgts(kw)%fly_dta(jpi1:jpi2,jpj1:jpj2,1), nrec, rec1, recn) 
    997       CASE(jpk)   
     997      CASE DEFAULT 
    998998           CALL iom_get( num, jpdom_unknown, clvar, ref_wgts(kw)%fly_dta(jpi1:jpi2,jpj1:jpj2,:), nrec, rec1, recn) 
    999999      END SELECT  
     
    10421042              CASE(1) 
    10431043                   CALL iom_get( num, jpdom_unknown, clvar, ref_wgts(kw)%col(:,jpj1:jpj2,1), nrec, rec1, recn) 
    1044               CASE(jpk)          
     1044              CASE DEFAULT 
    10451045                   CALL iom_get( num, jpdom_unknown, clvar, ref_wgts(kw)%col(:,jpj1:jpj2,:), nrec, rec1, recn) 
    10461046              END SELECT       
     
    10521052              CASE(1) 
    10531053                   CALL iom_get( num, jpdom_unknown, clvar, ref_wgts(kw)%col(:,jpj1:jpj2,1), nrec, rec1, recn) 
    1054               CASE(jpk) 
     1054              CASE DEFAULT 
    10551055                   CALL iom_get( num, jpdom_unknown, clvar, ref_wgts(kw)%col(:,jpj1:jpj2,:), nrec, rec1, recn) 
    10561056              END SELECT 
Note: See TracChangeset for help on using the changeset viewer.