Changeset 3709


Ignore:
Timestamp:
Apr 2, 2025, 4:00:26 PM (32 hours ago)
Author:
emillour
Message:

Pluto PCM:
Add reindexing of columns when reading/writing (re)startfi files. This is not
necessary with the lon-lat (LMDZ.COMMON) dynamical core, but required when
using DYNAMICO (where correspondance between dynamics and physics column
indexes changes with number of computing cores).
EM

Location:
trunk/LMDZ.PLUTO
Files:
2 edited

Legend:

Unmodified
Added
Removed
  • trunk/LMDZ.PLUTO/changelog.txt

    r3698 r3709  
    18571857  Updated files are put in "deftank/dynamico" for now.
    18581858
     1859== 02/04/2025 == EM
     1860Add reindexing of columns when reading/writing (re)startfi files. This is not
     1861necessary with the lon-lat (LMDZ.COMMON) dynamical core, but required when
     1862using DYNAMICO (where correspondance between dynamics and physics column
     1863indexes changes with number of computing cores).
     1864
  • trunk/LMDZ.PLUTO/libf/phypluto/iostart.F90

    r3184 r3709  
    5656        write(*,*)'open_startphy: problem opening file '//trim(filename)
    5757        write(*,*)trim(nf90_strerror(ierr))
    58         CALL ABORT
     58        CALL abort_physic("open_startphy","Failed opening file",1)
    5959      ENDIF
    6060    ENDIF
     
    120120                  //trim(field_name)
    121121        write(*,*)trim(nf90_strerror(ierr))
    122         CALL ABORT
     122        CALL abort_physic("inquire_field_ndims","Failed geting ndims",1)
    123123      ENDIF
    124124    ENDIF
     
    171171                  //trim(field_name)
    172172        write(*,*)trim(nf90_strerror(ierr))
    173         CALL ABORT
     173        CALL abort_physic("inquire_dimension_length","Failed geting dim length",1)
    174174      ENDIF
    175175    ENDIF
     
    269269  SUBROUTINE Get_field_rgen(field_name,field,field_size, &
    270270                            corners,edges,found)
    271   USE netcdf
    272   USE dimphy
    273   USE mod_grid_phy_lmdz
    274   USE mod_phys_lmdz_para
    275   IMPLICIT NONE
    276     CHARACTER(LEN=*) :: Field_name
    277     INTEGER          :: field_size
    278     REAL             :: field(klon,field_size)
     271  USE netcdf, ONLY: NF90_INQ_VARID, NF90_GET_VAR, NF90_NOERR
     272  USE dimphy, ONLY: klon ! number of columns on local grid
     273  USE geometry_mod, ONLY: ind_cell_glo
     274  USE mod_grid_phy_lmdz, ONLY: klon_glo ! number of columns on global grid
     275  USE mod_phys_lmdz_para, ONLY: is_master, bcast, scatter, gather
     276  IMPLICIT NONE
     277    CHARACTER(LEN=*),INTENT(IN) :: Field_name
     278    INTEGER,INTENT(IN) :: field_size
     279    REAL,INTENT(OUT) :: field(klon,field_size)
    279280    INTEGER,INTENT(IN) :: corners(4)
    280281    INTEGER,INTENT(IN) :: edges(4)
    281     LOGICAL,OPTIONAL :: found
    282    
    283     REAL    :: field_glo(klon_glo,field_size)
     282    LOGICAL,OPTIONAL,INTENT(OUT) :: found
     283   
     284    REAL :: field_glo(klon_glo,field_size) ! field on global grid
     285    REAL :: field_glo_tmp(klon_glo,field_size)
     286    INTEGER :: ind_cell_glo_glo(klon_glo) ! cell indexes on global grid
     287
    284288    LOGICAL :: tmp_found
    285289    INTEGER :: varid
    286     INTEGER :: ierr
     290    INTEGER :: ierr, i
     291   
     292    ! gather columns indexes on global grid
     293    CALL gather(ind_cell_glo,ind_cell_glo_glo)
    287294   
    288295    IF (is_master) THEN
     
    291298     
    292299      IF (ierr==NF90_NOERR) THEN
    293         CALL body(field_glo)
     300        CALL body(field_glo_tmp)
    294301        tmp_found=.TRUE.
    295302      ELSE
     
    297304      ENDIF
    298305   
    299     ENDIF
     306    ENDIF ! of IF (is_master)
    300307   
    301308    CALL bcast(tmp_found)
    302309
    303310    IF (tmp_found) THEN
     311      IF (is_master) THEN
     312        ! reorder columns according to ind_cell_glo(:) indexes
     313        DO i=1,klon_glo
     314          field_glo(i,:)=field_glo_tmp(ind_cell_glo_glo(i),:)
     315        ENDDO
     316      ENDIF
    304317      CALL scatter(field_glo,field)
    305318    ENDIF
     
    310323      IF (.NOT. tmp_found) THEN
    311324        PRINT*, 'get_field_rgen: Field <'//field_name//'> not found'
    312         CALL abort
     325        CALL abort_physic("get_field_rgen","Field not found",1)
    313326      ENDIF
    314327    ENDIF
     
    324337           PRINT*, 'get_field_rgen: Failed reading <'//field_name//'>'
    325338
    326 !           IF (field_name=='CLWCON' .OR. field_name=='RNEBCON' .OR. field_name=='RATQS') THEN
    327 !              ! Essaye de lire le variable sur surface uniqument, comme fait avant
    328 !              field_glo(:)=0.
    329 !              ierr=NF90_GET_VAR(nid_start,varid,field_glo(1:klon_glo))
    330 !              IF (ierr/=NF90_NOERR) THEN
    331 !                 PRINT*, 'phyetat0: Lecture echouee aussi en 2D pour <'//field_name//'>'
    332 !                 CALL abort
    333 !              ELSE
    334 !                 PRINT*, 'phyetat0: La variable <'//field_name//'> lu sur surface seulement'!, selon ancien format, le reste mis a zero'
    335 !              END IF
    336 !           ELSE
    337               CALL abort
    338 !           ENDIF
     339           CALL abort_physic("get_field_rgen","Failed to read field",1)
    339340         ENDIF
    340341
     
    408409
    409410  SUBROUTINE Get_var_rgen(var_name,var,var_size,found)
    410   USE netcdf
    411   USE dimphy
    412   USE mod_grid_phy_lmdz
    413   USE mod_phys_lmdz_para
     411  USE netcdf, ONLY: NF90_INQ_VARID, NF90_GET_VAR, NF90_NOERR
     412  USE mod_phys_lmdz_para, ONLY: is_master, bcast
    414413  IMPLICIT NONE
    415414    CHARACTER(LEN=*) :: var_name
     
    422421    INTEGER :: ierr
    423422   
    424     IF (is_mpi_root .AND. is_omp_root) THEN
     423    IF (is_master) THEN
    425424 
    426425      ierr=NF90_INQ_VARID(nid_start,var_name,varid)
     
    430429        IF (ierr/=NF90_NOERR) THEN
    431430          PRINT*, 'phyetat0: Failed loading <'//trim(var_name)//'>'
    432           CALL abort
     431          CALL abort_physic("get_var_rgen","Failed to read variable",1)
    433432        ENDIF
    434433        tmp_found=.TRUE.
     
    450449      IF (.NOT. tmp_found) THEN
    451450        PRINT*, 'phyetat0: Variable <'//trim(var_name)//'> not found'
    452         CALL abort
     451        CALL abort_physic("get_var_rgen","Variable not found",1)
    453452      ENDIF
    454453    ENDIF
     
    486485          write(*,*)'open_restartphy: problem creating file '//trim(filename)
    487486          write(*,*)trim(nf90_strerror(ierr))
    488           CALL ABORT
     487          CALL abort_physic("open_restartphy","Failed to create file",1)
    489488        ENDIF
    490489        already_created=.true.
     
    495494          write(*,*)'open_restartphy: problem opening file '//trim(filename)
    496495          write(*,*)trim(nf90_strerror(ierr))
    497           CALL ABORT
     496          CALL abort_physic("open_restartphy","Failed to open file",1)
    498497        ENDIF
    499498        return
     
    511510        write(*,*)'open_restartphy: problem defining index dimension '
    512511        write(*,*)trim(nf90_strerror(ierr))
    513         CALL ABORT
     512        CALL abort_physic("open_restartphy","Failed defining index dim",1)
    514513      ENDIF
    515514     
     
    518517        write(*,*)'open_restartphy: problem defining physical_points dimension '
    519518        write(*,*)trim(nf90_strerror(ierr))
    520         CALL ABORT
     519        CALL abort_physic("open_restartphy","Failed defining physical_points dim",1)
    521520      ENDIF
    522521     
     
    525524        write(*,*)'open_restartphy: problem defining subsurface_layers dimension '
    526525        write(*,*)trim(nf90_strerror(ierr))
    527         CALL ABORT
     526        CALL abort_physic("open_restartphy","Failed defining subsurface_layers dim",1)
    528527      ENDIF
    529528     
     
    532531        write(*,*)'open_restartphy: problem defining nlayer_plus_1 dimension '
    533532        write(*,*)trim(nf90_strerror(ierr))
    534         CALL ABORT
     533        CALL abort_physic("open_restartphy","Failed defining nlayer_plus_1 dim",1)
    535534      ENDIF
    536535     
     
    541540          write(*,*)'open_restartphy: problem defining number_of_advected_fields dimension '
    542541          write(*,*)trim(nf90_strerror(ierr))
    543           CALL ABORT
     542          CALL abort_physic("open_restartphy","Failed defining number_of_advected_fields dim",1)
    544543        ENDIF
    545544      endif
     
    549548        write(*,*)'open_restartphy: problem defining nlayer dimension '
    550549        write(*,*)trim(nf90_strerror(ierr))
    551         CALL ABORT
     550        CALL abort_physic("open_restartphy","Failed defining nlayer dim",1)
    552551      ENDIF
    553552     
     
    556555        write(*,*)'open_restartphy: problem defining Time dimension '
    557556        write(*,*)trim(nf90_strerror(ierr))
    558         CALL ABORT
    559       ENDIF
    560 
    561       ! ierr=NF90_DEF_DIM(nid_restart,"ocean_layers",nslay,idim8)
    562       ! IF (ierr/=NF90_NOERR) THEN
    563       !   write(*,*)'open_restartphy: problem defining oceanic layer dimension '
    564       !   write(*,*)trim(nf90_strerror(ierr))
    565       !   CALL ABORT
    566       ! ENDIF
    567 
     557        CALL abort_physic("open_restartphy","Failed defining Time dim",1)
     558      ENDIF
    568559
    569560      ierr=NF90_ENDDEF(nid_restart)
     
    571562        write(*,*)'open_restartphy: problem ending definition mode '
    572563        write(*,*)trim(nf90_strerror(ierr))
    573         CALL ABORT
     564        CALL abort_physic("open_restartphy","Failed ending definition mode",1)
    574565      ENDIF
    575566    ENDIF
     
    642633 
    643634  SUBROUTINE put_field_rgen(field_name,title,field,field_size,time)
    644   USE netcdf
    645   USE dimphy
     635  USE netcdf, ONLY: NF90_REDEF, NF90_ENDDEF, NF90_DEF_VAR, NF90_PUT_ATT, &
     636                    NF90_INQ_VARID, NF90_PUT_VAR, NF90_STRERROR, &
     637                    NF90_NOERR, NF90_FLOAT, NF90_DOUBLE
     638  USE dimphy, ONLY: klon, klev, klevp1
    646639  USE comsoil_h, only: nsoilmx
    647   USE mod_grid_phy_lmdz
    648   USE mod_phys_lmdz_para
    649 !  USE slab_ice_h, only: noceanmx
    650   ! USE ocean_slab_mod, ONLY: nslay
     640  USE mod_grid_phy_lmdz, ONLY: klon_glo
     641  USE mod_phys_lmdz_para, ONLY: is_master, gather
     642  USE geometry_mod, ONLY: ind_cell_glo
    651643
    652644  IMPLICIT NONE
     
    657649  REAL,OPTIONAL,INTENT(IN)       :: time
    658650 
    659   REAL                           :: field_glo(klon_glo,field_size)
     651  REAL :: field_glo(klon_glo,field_size)
     652  REAL :: field_glo_tmp(klon_glo,field_size)
     653  INTEGER :: ind_cell_glo_glo(klon_glo) ! cell indexes on global grid
     654 
    660655  INTEGER                        :: ierr
    661656  INTEGER                        :: nvarid
    662657  INTEGER                        :: idim
     658  INTEGER :: i
    663659   
    664     CALL gather(field,field_glo)
    665    
    666     IF (is_master) THEN
    667 
     660    ! gather indexes on global grid
     661    CALL gather(ind_cell_glo,ind_cell_glo_glo)
     662    ! gather field on master
     663    CALL gather(field,field_glo_tmp)
     664   
     665    IF (is_master) THEN
     666      ! reorder columns
     667      DO i=1,klon_glo
     668        field_glo(ind_cell_glo_glo(i),:)=field_glo_tmp(i,:)
     669      ENDDO
     670     
    668671      IF (field_size==1) THEN
    669672        ! input is a 1D "surface field" array
     
    882885        PRINT *, "Error phyredem(put_field_rgen) : wrong dimension for ",trim(field_name)
    883886        write(*,*) "  field_size =",field_size
    884         CALL ABORT
     887        CALL abort_physic("put_field_rgen","Wrong field dimensions",1)
    885888      ENDIF
    886889
     
    889892        write(*,*) " Error phyredem(put_field_rgen) : failed writing ",trim(field_name)
    890893        write(*,*)trim(nf90_strerror(ierr))
    891         call abort
     894        call abort_physic("put_field_rgen","Failed writing variable",1)
    892895      endif
    893896
     
    995998          write(*,*)'put_var_rgen: problem writing Time'
    996999          write(*,*)trim(nf90_strerror(ierr))
    997           CALL ABORT
     1000          CALL abort_physic("put_var_rgen","Failed writing Time",1)
    9981001        ENDIF
    9991002        return ! nothing left to do
     
    10101013        PRINT *, "put_var_rgen error : wrong dimension"
    10111014        write(*,*) "  var_size =",var_size
    1012         CALL abort
     1015        CALL abort_physic("put_var_rgen","Wrong field dimensions",1)
    10131016
    10141017      ENDIF ! of IF (var_size==length) THEN
     
    10311034        write(*,*)'put_var_rgen: problem writing '//trim(var_name)
    10321035        write(*,*)trim(nf90_strerror(ierr))
    1033         CALL ABORT
     1036        CALL abort_physic("put_var_rgen","Failed writing variable",1)
    10341037      ENDIF
    10351038    ENDIF ! of IF (is_master)
Note: See TracChangeset for help on using the changeset viewer.