Ignore:
Timestamp:
Jul 23, 2024, 8:22:55 AM (4 months ago)
Author:
abarral
Message:

Handle DEBUG_IO in lmdz_cppkeys_wrapper.F90
Transform some files .F -> .[fF]90
[ne compile pas à cause de writefield_u non défini - en attente de réponse Laurent]

Location:
LMDZ6/branches/Amaury_dev/libf/misc
Files:
16 edited

Legend:

Unmodified
Added
Removed
  • LMDZ6/branches/Amaury_dev/libf/misc/ioipsl_errioipsl.F90

    r5099 r5101  
    129129!! the current level of the error messages
    130130!! and the maximum level encountered since the
    131 !! last call to "ipslerr_act".
     131!! last CALL to "ipslerr_act".
    132132!!
    133133!! SUBROUTINE ipslerr_inq (current_level,maximum_level)
  • LMDZ6/branches/Amaury_dev/libf/misc/ioipsl_getincom.F90

    r5099 r5101  
    1111! See IOIPSL/IOIPSL_License_CeCILL.txt
    1212!---------------------------------------------------------------------
    13 USE ioipsl_errioipsl, ONLY : ipslerr
     13USE ioipsl_errioipsl, ONLY: ipslerr
    1414USE ioipsl_stringop, &
    15      ONLY : nocomma,cmpblank,strlowercase
     15     ONLY: nocomma,cmpblank,strlowercase
    1616!-
    1717IMPLICIT NONE
  • LMDZ6/branches/Amaury_dev/libf/misc/j4save.F

    r2197 r5101  
    44C***BEGIN PROLOGUE  J4SAVE
    55C***SUBSIDIARY
    6 C***PURPOSE  Save or recall global variables needed by error
     6C***PURPOSE  Save or reCALL global variables needed by error
    77C            handling routines.
    88C***LIBRARY   SLATEC (XERROR)
  • LMDZ6/branches/Amaury_dev/libf/misc/lmdz_cppkeys_wrapper.F90

    r5099 r5101  
    1313
    1414MODULE lmdz_cppkeys_wrapper
    15   USE, INTRINSIC :: ISO_FORTRAN_ENV, ONLY : REAL64, REAL32
     15  USE, INTRINSIC :: ISO_FORTRAN_ENV, ONLY: REAL64, REAL32
    1616  USE netcdf, ONLY: nf90_float, nf90_double
    1717  IMPLICIT NONE; PRIVATE
    18   PUBLIC nf90_format, CPPKEY_PHYS, CPPKEY_INCA, CPPKEY_STRATAER, CPPKEY_DUST
     18  PUBLIC nf90_format, CPPKEY_PHYS, CPPKEY_INCA, CPPKEY_STRATAER, CPPKEY_DUST, &
     19      CPPKEY_DEBUGIO
    1920
    2021#ifdef NC_DOUBLE
     
    4849#endif
    4950
     51#ifdef DEBUG_IO
     52  LOGICAL, PARAMETER :: CPPKEY_DEBUGIO = .TRUE.
     53#else
     54  LOGICAL, PARAMETER :: CPPKEY_DEBUGIO = .FALSE.
     55#endif
     56
    5057END MODULE lmdz_cppkeys_wrapper
  • LMDZ6/branches/Amaury_dev/libf/misc/lmdz_mpi_wrappers.F90

    r4600 r5101  
    6666
    6767SUBROUTINE MPI_WAITALL(COUNT, ARRAY_OF_REQUESTS, ARRAY_OF_STATUSES, IERROR)
    68 USE lmdz_mpi, ONLY : MPI_STATUS_SIZE
     68USE lmdz_mpi, ONLY: MPI_STATUS_SIZE
    6969IMPLICIT NONE
    7070    INTEGER    COUNT, ARRAY_OF_REQUESTS(*)
     
    105105
    106106SUBROUTINE MPI_ALLOC_MEM(SIZE, INFO, BASEPTR, IERROR)
    107 USE lmdz_mpi, ONLY : MPI_ADDRESS_KIND
     107USE lmdz_mpi, ONLY: MPI_ADDRESS_KIND
    108108IMPLICIT NONE
    109109    INTEGER INFO, IERROR
     
    131131SUBROUTINE MPI_RECV(BUF, COUNT, DATATYPE, SOURCE, TAG, COMM, STATUS, IERROR)
    132132USE ISO_C_BINDING
    133 USE lmdz_mpi, ONLY : MPI_STATUS_SIZE
     133USE lmdz_mpi, ONLY: MPI_STATUS_SIZE
    134134IMPLICIT NONE
    135135    TYPE(C_PTR),VALUE ::    BUF
  • LMDZ6/branches/Amaury_dev/libf/misc/pchfe.F

    r5086 r5101  
    113113C        b. Change the real declaration to double precision,
    114114C
    115 C     2. Most of the coding between the call to CHFEV and the end of
     115C     2. Most of the coding between the CALL to CHFEV and the end of
    116116C        the IR-loop could be eliminated if it were permissible to
    117117C        assume that XE is ordered relative to X.
  • LMDZ6/branches/Amaury_dev/libf/misc/pchfe_95_m.F90

    r1907 r5101  
    7070    n = assert_eq(size(x), size(f), size(d), "PCHFE_95 n")
    7171    ne = assert_eq(size(xe), size(fe), "PCHFE_95 ne")
    72     call PCHFE(N, X, F, D, 1, SKIP, NE, XE, FE, IERR)
     72    CALL PCHFE(N, X, F, D, 1, SKIP, NE, XE, FE, IERR)
    7373
    7474  end SUBROUTINE PCHFE_95
  • LMDZ6/branches/Amaury_dev/libf/misc/pchsp_95_m.F90

    r1907 r5101  
    109109    if (present(vc_beg)) vc(1) = vc_beg
    110110    if (present(vc_end)) vc(2) = vc_end
    111     call PCHSP(IC, VC, N, X, F, pchsp_95, 1, WK, size(WK), IERR)
     111    CALL PCHSP(IC, VC, N, X, F, pchsp_95, 1, WK, size(WK), IERR)
    112112    if (ierr /= 0) stop 1
    113113
  • LMDZ6/branches/Amaury_dev/libf/misc/regr1_step_av_m.F90

    r5086 r5101  
    5555    nt = size(xt) - 1
    5656    ! Quick check on sort order:
    57     call assert(xs(1) < xs(2), "regr11_step_av xs bad order")
    58     call assert(xt(1) < xt(2), "regr11_step_av xt bad order")
    59 
    60     call assert(xs(1) <= xt(1) .and. xt(nt + 1) <= xs(ns + 1), &
     57    CALL assert(xs(1) < xs(2), "regr11_step_av xs bad order")
     58    CALL assert(xt(1) < xt(2), "regr11_step_av xt bad order")
     59
     60    CALL assert(xs(1) <= xt(1) .and. xt(nt + 1) <= xs(ns + 1), &
    6161         "regr11_step_av extrapolation")
    6262
     
    115115
    116116    ! Quick check on sort order:
    117     call assert(xs(1) < xs(2), "regr12_step_av xs bad order")
    118     call assert(xt(1) < xt(2), "regr12_step_av xt bad order")
    119 
    120     call assert(xs(1) <= xt(1) .and. xt(nt + 1) <= xs(ns + 1), &
     117    CALL assert(xs(1) < xs(2), "regr12_step_av xs bad order")
     118    CALL assert(xt(1) < xt(2), "regr12_step_av xt bad order")
     119
     120    CALL assert(xs(1) <= xt(1) .and. xt(nt + 1) <= xs(ns + 1), &
    121121         "regr12_step_av extrapolation")
    122122
     
    176176
    177177    ! Quick check on sort order:
    178     call assert(xs(1) < xs(2), "regr13_step_av xs bad order")
    179     call assert(xt(1) < xt(2), "regr13_step_av xt bad order")
    180 
    181     call assert(xs(1) <= xt(1) .and. xt(nt + 1) <= xs(ns + 1), &
     178    CALL assert(xs(1) < xs(2), "regr13_step_av xs bad order")
     179    CALL assert(xt(1) < xt(2), "regr13_step_av xt bad order")
     180
     181    CALL assert(xs(1) <= xt(1) .and. xt(nt + 1) <= xs(ns + 1), &
    182182         "regr13_step_av extrapolation")
    183183
     
    237237
    238238    ! Quick check on sort order:
    239     call assert(xs(1) < xs(2), "regr14_step_av xs bad order")
    240     call assert(xt(1) < xt(2), "regr14_step_av xt bad order")
    241 
    242     call assert(xs(1) <= xt(1) .and. xt(nt + 1) <= xs(ns + 1), &
     239    CALL assert(xs(1) < xs(2), "regr14_step_av xs bad order")
     240    CALL assert(xt(1) < xt(2), "regr14_step_av xt bad order")
     241
     242    CALL assert(xs(1) <= xt(1) .and. xt(nt + 1) <= xs(ns + 1), &
    243243         "regr14_step_av extrapolation")
    244244
  • LMDZ6/branches/Amaury_dev/libf/misc/regr_lint_m.F90

    r5099 r5101  
    4949!-------------------------------------------------------------------------------
    5050  CALL check_size(ix,SHAPE(vs),SHAPE(vt),SIZE(xs),SIZE(xt),ns,nt)
    51   is = -1 ! go immediately to bisection on first call to "hunt"
     51  is = -1 ! go immediately to bisection on first CALL to "hunt"
    5252  DO it=1,SIZE(xt)
    5353    CALL hunt(xs,xt(it),is); isb=MIN(MAX(is,1),ns-1)
     
    7878!-------------------------------------------------------------------------------
    7979  CALL check_size(ix,SHAPE(vs),SHAPE(vt),SIZE(xs),SIZE(xt),ns,nt)
    80   is = -1 ! go immediately to bisection on first call to "hunt"
     80  is = -1 ! go immediately to bisection on first CALL to "hunt"
    8181  DO it=1,SIZE(xt)
    8282    CALL hunt(xs,xt(it),is); isb=MIN(MAX(is,1),ns-1)
     
    108108!-------------------------------------------------------------------------------
    109109  CALL check_size(ix,SHAPE(vs),SHAPE(vt),SIZE(xs),SIZE(xt),ns,nt)
    110   is = -1 ! go immediately to bisection on first call to "hunt"
     110  is = -1 ! go immediately to bisection on first CALL to "hunt"
    111111  DO it=1,SIZE(xt)
    112112    CALL hunt(xs,xt(it),is); isb=MIN(MAX(is,1),ns-1)
     
    139139!-------------------------------------------------------------------------------
    140140  CALL check_size(ix,SHAPE(vs),SHAPE(vt),SIZE(xs),SIZE(xt),ns,nt)
    141   is = -1 ! go immediately to bisection on first call to "hunt"
     141  is = -1 ! go immediately to bisection on first CALL to "hunt"
    142142  DO it=1,SIZE(xt)
    143143    CALL hunt(xs,xt(it),is); isb=MIN(MAX(is,1),ns-1)
     
    171171!-------------------------------------------------------------------------------
    172172  CALL check_size(ix,SHAPE(vs),SHAPE(vt),SIZE(xs),SIZE(xt),ns,nt)
    173   is = -1 ! go immediately to bisection on first call to "hunt"
     173  is = -1 ! go immediately to bisection on first CALL to "hunt"
    174174  DO it=1,SIZE(xt)
    175175    CALL hunt(xs,xt(it),is); isb=MIN(MAX(is,1),ns-1)
  • LMDZ6/branches/Amaury_dev/libf/misc/vampir.F90

    r1907 r5101  
    2222    integer :: ierr
    2323   
    24     call VTSYMDEF(VTcaldyn,"caldyn","caldyn",ierr)
    25     call VTSYMDEF(VTintegre,"integre","integre",ierr)
    26     call VTSYMDEF(VTadvection,"advection","advection",ierr)
    27     call VTSYMDEF(VTdissipation,"dissipation","dissipation",ierr)
    28     call VTSYMDEF(VThallo,"hallo","hallo",ierr)
    29     call VTSYMDEF(VTphysiq,"physiq","physiq",ierr)
    30     call VTSYMDEF(VTinca,"inca","inca",ierr)
     24    CALL VTSYMDEF(VTcaldyn,"caldyn","caldyn",ierr)
     25    CALL VTSYMDEF(VTintegre,"integre","integre",ierr)
     26    CALL VTSYMDEF(VTadvection,"advection","advection",ierr)
     27    CALL VTSYMDEF(VTdissipation,"dissipation","dissipation",ierr)
     28    CALL VTSYMDEF(VThallo,"hallo","hallo",ierr)
     29    CALL VTSYMDEF(VTphysiq,"physiq","physiq",ierr)
     30    CALL VTSYMDEF(VTinca,"inca","inca",ierr)
    3131#endif
    3232
     
    5656    integer :: ierr
    5757   
    58     call VTBEGIN(number,ierr)
     58    CALL VTBEGIN(number,ierr)
    5959#endif
    6060#ifdef USE_MPE
     
    7373    integer :: ierr
    7474   
    75     call VTEND(number,ierr)
     75    CALL VTEND(number,ierr)
    7676#endif   
    7777
  • LMDZ6/branches/Amaury_dev/libf/misc/write_field.F90

    r5093 r5101  
    4646     
    4747      Dim=shape(Field)
    48       call WriteField_gen(name,Field,Dim(1),Dim(2),Dim(3)) 
     48      CALL WriteField_gen(name,Field,Dim(1),Dim(2),Dim(3))
    4949 
    5050    end subroutine WriteField3d
     
    5757     
    5858      Dim=shape(Field)
    59       call WriteField_gen(name,Field,Dim(1),Dim(2),1) 
     59      CALL WriteField_gen(name,Field,Dim(1),Dim(2),1)
    6060 
    6161    end subroutine WriteField2d
     
    6868     
    6969      Dim=shape(Field)
    70       call WriteField_gen(name,Field,Dim(1),1,1) 
     70      CALL WriteField_gen(name,Field,Dim(1),1,1)
    7171 
    7272    end subroutine WriteField1d
     
    8686      Index=GetFieldIndex(name)
    8787      if (Index==-1) then
    88         call CreateNewField(name,dimx,dimy,dimz)
     88        CALL CreateNewField(name,dimx,dimy,dimz)
    8989        Index=GetFieldIndex(name)
    9090      else
  • LMDZ6/branches/Amaury_dev/libf/misc/wxios.F90

    r5099 r5101  
    9595
    9696    SUBROUTINE wxios_init(xios_ctx_name, locom, outcom, type_ocean)
    97         USE print_control_mod, ONLY : prt_level, lunout
     97        USE print_control_mod, ONLY: prt_level, lunout
    9898        IMPLICIT NONE
    9999
     
    137137
    138138    SUBROUTINE wxios_context_init()
    139         USE print_control_mod, ONLY : prt_level, lunout
    140         USE mod_phys_lmdz_mpi_data, ONLY : COMM_LMDZ_PHY
     139        USE print_control_mod, ONLY: prt_level, lunout
     140        USE mod_phys_lmdz_mpi_data, ONLY: COMM_LMDZ_PHY
    141141        IMPLICIT NONE
    142142
     
    155155        IF (prt_level >= 10) THEN
    156156          WRITE(lunout,*) "wxios_context_init: Current context is ",trim(g_ctx_name)
    157           WRITE(lunout,*) "     now call xios_solve_inheritance()"
     157          WRITE(lunout,*) "     now CALL xios_solve_inheritance()"
    158158        ENDIF
    159159        !Une première analyse des héritages:
     
    168168      ! routine create by Anne Cozic (2023)
    169169      ! This routine will create field associated to group defined without description of fields in field.xml file
    170       ! This routine need to be call before "xios_sole_inheritance" after an !$OMP MASTER directive
     170      ! This routine need to be CALL before "xios_sole_inheritance" after an !$OMP MASTER directive
    171171     
    172172      USE infotrac_phy, ONLY: nbtr, nqtot, nqo, type_trac, tracers, niso, ntiso
     
    291291
    292292    SUBROUTINE wxios_set_cal(pasdetemps, calendrier, annee, mois, jour, heure, ini_an, ini_mois, ini_jour, ini_heure)
    293         USE print_control_mod, ONLY : prt_level, lunout
     293        USE print_control_mod, ONLY: prt_level, lunout
    294294        IMPLICIT NONE
    295295
     
    364364                                     is_sequential, is_south_pole_dyn
    365365       USE mod_grid_phy_lmdz, only: nbp_lon, nbp_lat, klon_glo         
    366        USE print_control_mod, ONLY : prt_level, lunout
     366       USE print_control_mod, ONLY: prt_level, lunout
    367367       USE geometry_mod
    368368
     
    446446
    447447    SUBROUTINE wxios_domain_param_unstructured(dom_id)
    448         USE geometry_mod, ONLY : longitude, latitude, boundslon, boundslat,ind_cell_glo
    449         USE mod_grid_phy_lmdz, ONLY : nvertex, klon_glo
     448        USE geometry_mod, ONLY: longitude, latitude, boundslon, boundslat,ind_cell_glo
     449        USE mod_grid_phy_lmdz, ONLY: nvertex, klon_glo
    450450        USE mod_phys_lmdz_para
    451         USE nrtype, ONLY : PI
    452         USE ioipsl_getin_p_mod, ONLY : getin_p
     451        USE nrtype, ONLY: PI
     452        USE ioipsl_getin_p_mod, ONLY: getin_p
    453453        IMPLICIT NONE
    454454        CHARACTER(len=*),INTENT(IN) :: dom_id ! domain identifier
     
    501501    SUBROUTINE wxios_add_vaxis(axis_id, axis_size, axis_value,     &
    502502                               positif, bnds)
    503         USE print_control_mod, ONLY : prt_level, lunout
     503        USE print_control_mod, ONLY: prt_level, lunout
    504504        IMPLICIT NONE
    505505
     
    558558    !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
    559559    SUBROUTINE wxios_add_file(fname, ffreq, flvl)
    560         USE print_control_mod, ONLY : prt_level, lunout
     560        USE print_control_mod, ONLY: prt_level, lunout
    561561        IMPLICIT NONE
    562562
     
    642642    !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
    643643    SUBROUTINE wxios_add_field_to_file(fieldname, fdim, fid, fname, fieldlongname, fieldunit, field_level, op, nam_axvert)
    644         USE print_control_mod, ONLY : prt_level, lunout
     644        USE print_control_mod, ONLY: prt_level, lunout
    645645        IMPLICIT NONE
    646646
  • LMDZ6/branches/Amaury_dev/libf/misc/xercnt.F

    r2197 r5101  
    1616C        Just after each message is recorded, but before it is
    1717C        processed any further (i.e., before it is printed or
    18 C        a decision to abort is made), a call is made to XERCNT.
     18C        a decision to abort is made), a CALL is made to XERCNT.
    1919C        If the user has provided his own version of XERCNT, he
    2020C        can then override the value of KONTROL used in processing
     
    3232C        SUBROU - the subroutine that XERMSG is being called from
    3333C        MESSG  - the first 20 characters of the error message.
    34 C        NERR   - same as in the call to XERMSG.
    35 C        LEVEL  - same as in the call to XERMSG.
     34C        NERR   - same as in the CALL to XERMSG.
     35C        LEVEL  - same as in the CALL to XERMSG.
    3636C        KONTRL - the current value of the control flag as set
    37 C                 by a call to XSETF.
     37C                 by a CALL to XSETF.
    3838C
    3939C      --Output--
  • LMDZ6/branches/Amaury_dev/libf/misc/xermsg.F

    r5086 r5101  
    135135C    Each of the arguments to XERMSG is input; none will be modified by
    136136C    XERMSG.  A routine may make multiple calls to XERMSG with warning
    137 C    level messages; however, after a call to XERMSG with a recoverable
     137C    level messages; however, after a CALL to XERMSG with a recoverable
    138138C    error, the routine should return to the user.  Do not try to call
    139139C    XERMSG with a second recoverable error after the first recoverable
     
    145145C    This is considered harmless for error numbers associated with
    146146C    warning messages but must not be done for error numbers of serious
    147 C    errors.  After a call to XERMSG with a recoverable error, the user
    148 C    must be given a chance to call NUMXER or XERCLR to retrieve or
     147C    errors.  After a CALL to XERMSG with a recoverable error, the user
     148C    must be given a chance to CALL NUMXER or XERCLR to retrieve or
    149149C    clear the error number.
    150150C***REFERENCES  R. E. Jones and D. K. Kahaner, XERROR, the SLATEC
  • LMDZ6/branches/Amaury_dev/libf/misc/xgetua.F

    r5086 r5101  
    1515C        XGETUA may be called to determine the unit number or numbers
    1616C        to which error messages are being sent.
    17 C        These unit numbers may have been set by a call to XSETUN,
    18 C        or a call to XSETUA, or may be a default value.
     17C        These unit numbers may have been set by a CALL to XSETUN,
     18C        or a CALL to XSETUA, or may be a default value.
    1919C
    2020C     Description of Parameters
Note: See TracChangeset for help on using the changeset viewer.