Changeset 5101 for LMDZ6/branches/Amaury_dev/libf/misc
- Timestamp:
- Jul 23, 2024, 8:22:55 AM (4 months ago)
- 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 129 129 !! the current level of the error messages 130 130 !! and the maximum level encountered since the 131 !! last callto "ipslerr_act".131 !! last CALL to "ipslerr_act". 132 132 !! 133 133 !! SUBROUTINE ipslerr_inq (current_level,maximum_level) -
LMDZ6/branches/Amaury_dev/libf/misc/ioipsl_getincom.F90
r5099 r5101 11 11 ! See IOIPSL/IOIPSL_License_CeCILL.txt 12 12 !--------------------------------------------------------------------- 13 USE ioipsl_errioipsl, ONLY 13 USE ioipsl_errioipsl, ONLY: ipslerr 14 14 USE ioipsl_stringop, & 15 ONLY 15 ONLY: nocomma,cmpblank,strlowercase 16 16 !- 17 17 IMPLICIT NONE -
LMDZ6/branches/Amaury_dev/libf/misc/j4save.F
r2197 r5101 4 4 C***BEGIN PROLOGUE J4SAVE 5 5 C***SUBSIDIARY 6 C***PURPOSE Save or re callglobal variables needed by error6 C***PURPOSE Save or reCALL global variables needed by error 7 7 C handling routines. 8 8 C***LIBRARY SLATEC (XERROR) -
LMDZ6/branches/Amaury_dev/libf/misc/lmdz_cppkeys_wrapper.F90
r5099 r5101 13 13 14 14 MODULE lmdz_cppkeys_wrapper 15 USE, INTRINSIC :: ISO_FORTRAN_ENV, ONLY 15 USE, INTRINSIC :: ISO_FORTRAN_ENV, ONLY: REAL64, REAL32 16 16 USE netcdf, ONLY: nf90_float, nf90_double 17 17 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 19 20 20 21 #ifdef NC_DOUBLE … … 48 49 #endif 49 50 51 #ifdef DEBUG_IO 52 LOGICAL, PARAMETER :: CPPKEY_DEBUGIO = .TRUE. 53 #else 54 LOGICAL, PARAMETER :: CPPKEY_DEBUGIO = .FALSE. 55 #endif 56 50 57 END MODULE lmdz_cppkeys_wrapper -
LMDZ6/branches/Amaury_dev/libf/misc/lmdz_mpi_wrappers.F90
r4600 r5101 66 66 67 67 SUBROUTINE MPI_WAITALL(COUNT, ARRAY_OF_REQUESTS, ARRAY_OF_STATUSES, IERROR) 68 USE lmdz_mpi, ONLY 68 USE lmdz_mpi, ONLY: MPI_STATUS_SIZE 69 69 IMPLICIT NONE 70 70 INTEGER COUNT, ARRAY_OF_REQUESTS(*) … … 105 105 106 106 SUBROUTINE MPI_ALLOC_MEM(SIZE, INFO, BASEPTR, IERROR) 107 USE lmdz_mpi, ONLY 107 USE lmdz_mpi, ONLY: MPI_ADDRESS_KIND 108 108 IMPLICIT NONE 109 109 INTEGER INFO, IERROR … … 131 131 SUBROUTINE MPI_RECV(BUF, COUNT, DATATYPE, SOURCE, TAG, COMM, STATUS, IERROR) 132 132 USE ISO_C_BINDING 133 USE lmdz_mpi, ONLY 133 USE lmdz_mpi, ONLY: MPI_STATUS_SIZE 134 134 IMPLICIT NONE 135 135 TYPE(C_PTR),VALUE :: BUF -
LMDZ6/branches/Amaury_dev/libf/misc/pchfe.F
r5086 r5101 113 113 C b. Change the real declaration to double precision, 114 114 C 115 C 2. Most of the coding between the callto CHFEV and the end of115 C 2. Most of the coding between the CALL to CHFEV and the end of 116 116 C the IR-loop could be eliminated if it were permissible to 117 117 C assume that XE is ordered relative to X. -
LMDZ6/branches/Amaury_dev/libf/misc/pchfe_95_m.F90
r1907 r5101 70 70 n = assert_eq(size(x), size(f), size(d), "PCHFE_95 n") 71 71 ne = assert_eq(size(xe), size(fe), "PCHFE_95 ne") 72 callPCHFE(N, X, F, D, 1, SKIP, NE, XE, FE, IERR)72 CALL PCHFE(N, X, F, D, 1, SKIP, NE, XE, FE, IERR) 73 73 74 74 end SUBROUTINE PCHFE_95 -
LMDZ6/branches/Amaury_dev/libf/misc/pchsp_95_m.F90
r1907 r5101 109 109 if (present(vc_beg)) vc(1) = vc_beg 110 110 if (present(vc_end)) vc(2) = vc_end 111 callPCHSP(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) 112 112 if (ierr /= 0) stop 1 113 113 -
LMDZ6/branches/Amaury_dev/libf/misc/regr1_step_av_m.F90
r5086 r5101 55 55 nt = size(xt) - 1 56 56 ! Quick check on sort order: 57 callassert(xs(1) < xs(2), "regr11_step_av xs bad order")58 callassert(xt(1) < xt(2), "regr11_step_av xt bad order")59 60 callassert(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), & 61 61 "regr11_step_av extrapolation") 62 62 … … 115 115 116 116 ! Quick check on sort order: 117 callassert(xs(1) < xs(2), "regr12_step_av xs bad order")118 callassert(xt(1) < xt(2), "regr12_step_av xt bad order")119 120 callassert(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), & 121 121 "regr12_step_av extrapolation") 122 122 … … 176 176 177 177 ! Quick check on sort order: 178 callassert(xs(1) < xs(2), "regr13_step_av xs bad order")179 callassert(xt(1) < xt(2), "regr13_step_av xt bad order")180 181 callassert(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), & 182 182 "regr13_step_av extrapolation") 183 183 … … 237 237 238 238 ! Quick check on sort order: 239 callassert(xs(1) < xs(2), "regr14_step_av xs bad order")240 callassert(xt(1) < xt(2), "regr14_step_av xt bad order")241 242 callassert(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), & 243 243 "regr14_step_av extrapolation") 244 244 -
LMDZ6/branches/Amaury_dev/libf/misc/regr_lint_m.F90
r5099 r5101 49 49 !------------------------------------------------------------------------------- 50 50 CALL check_size(ix,SHAPE(vs),SHAPE(vt),SIZE(xs),SIZE(xt),ns,nt) 51 is = -1 ! go immediately to bisection on first callto "hunt"51 is = -1 ! go immediately to bisection on first CALL to "hunt" 52 52 DO it=1,SIZE(xt) 53 53 CALL hunt(xs,xt(it),is); isb=MIN(MAX(is,1),ns-1) … … 78 78 !------------------------------------------------------------------------------- 79 79 CALL check_size(ix,SHAPE(vs),SHAPE(vt),SIZE(xs),SIZE(xt),ns,nt) 80 is = -1 ! go immediately to bisection on first callto "hunt"80 is = -1 ! go immediately to bisection on first CALL to "hunt" 81 81 DO it=1,SIZE(xt) 82 82 CALL hunt(xs,xt(it),is); isb=MIN(MAX(is,1),ns-1) … … 108 108 !------------------------------------------------------------------------------- 109 109 CALL check_size(ix,SHAPE(vs),SHAPE(vt),SIZE(xs),SIZE(xt),ns,nt) 110 is = -1 ! go immediately to bisection on first callto "hunt"110 is = -1 ! go immediately to bisection on first CALL to "hunt" 111 111 DO it=1,SIZE(xt) 112 112 CALL hunt(xs,xt(it),is); isb=MIN(MAX(is,1),ns-1) … … 139 139 !------------------------------------------------------------------------------- 140 140 CALL check_size(ix,SHAPE(vs),SHAPE(vt),SIZE(xs),SIZE(xt),ns,nt) 141 is = -1 ! go immediately to bisection on first callto "hunt"141 is = -1 ! go immediately to bisection on first CALL to "hunt" 142 142 DO it=1,SIZE(xt) 143 143 CALL hunt(xs,xt(it),is); isb=MIN(MAX(is,1),ns-1) … … 171 171 !------------------------------------------------------------------------------- 172 172 CALL check_size(ix,SHAPE(vs),SHAPE(vt),SIZE(xs),SIZE(xt),ns,nt) 173 is = -1 ! go immediately to bisection on first callto "hunt"173 is = -1 ! go immediately to bisection on first CALL to "hunt" 174 174 DO it=1,SIZE(xt) 175 175 CALL hunt(xs,xt(it),is); isb=MIN(MAX(is,1),ns-1) -
LMDZ6/branches/Amaury_dev/libf/misc/vampir.F90
r1907 r5101 22 22 integer :: ierr 23 23 24 callVTSYMDEF(VTcaldyn,"caldyn","caldyn",ierr)25 callVTSYMDEF(VTintegre,"integre","integre",ierr)26 callVTSYMDEF(VTadvection,"advection","advection",ierr)27 callVTSYMDEF(VTdissipation,"dissipation","dissipation",ierr)28 callVTSYMDEF(VThallo,"hallo","hallo",ierr)29 callVTSYMDEF(VTphysiq,"physiq","physiq",ierr)30 callVTSYMDEF(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) 31 31 #endif 32 32 … … 56 56 integer :: ierr 57 57 58 callVTBEGIN(number,ierr)58 CALL VTBEGIN(number,ierr) 59 59 #endif 60 60 #ifdef USE_MPE … … 73 73 integer :: ierr 74 74 75 callVTEND(number,ierr)75 CALL VTEND(number,ierr) 76 76 #endif 77 77 -
LMDZ6/branches/Amaury_dev/libf/misc/write_field.F90
r5093 r5101 46 46 47 47 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)) 49 49 50 50 end subroutine WriteField3d … … 57 57 58 58 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) 60 60 61 61 end subroutine WriteField2d … … 68 68 69 69 Dim=shape(Field) 70 call WriteField_gen(name,Field,Dim(1),1,1)70 CALL WriteField_gen(name,Field,Dim(1),1,1) 71 71 72 72 end subroutine WriteField1d … … 86 86 Index=GetFieldIndex(name) 87 87 if (Index==-1) then 88 callCreateNewField(name,dimx,dimy,dimz)88 CALL CreateNewField(name,dimx,dimy,dimz) 89 89 Index=GetFieldIndex(name) 90 90 else -
LMDZ6/branches/Amaury_dev/libf/misc/wxios.F90
r5099 r5101 95 95 96 96 SUBROUTINE wxios_init(xios_ctx_name, locom, outcom, type_ocean) 97 USE print_control_mod, ONLY 97 USE print_control_mod, ONLY: prt_level, lunout 98 98 IMPLICIT NONE 99 99 … … 137 137 138 138 SUBROUTINE wxios_context_init() 139 USE print_control_mod, ONLY 140 USE mod_phys_lmdz_mpi_data, ONLY 139 USE print_control_mod, ONLY: prt_level, lunout 140 USE mod_phys_lmdz_mpi_data, ONLY: COMM_LMDZ_PHY 141 141 IMPLICIT NONE 142 142 … … 155 155 IF (prt_level >= 10) THEN 156 156 WRITE(lunout,*) "wxios_context_init: Current context is ",trim(g_ctx_name) 157 WRITE(lunout,*) " now callxios_solve_inheritance()"157 WRITE(lunout,*) " now CALL xios_solve_inheritance()" 158 158 ENDIF 159 159 !Une première analyse des héritages: … … 168 168 ! routine create by Anne Cozic (2023) 169 169 ! 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 directive170 ! This routine need to be CALL before "xios_sole_inheritance" after an !$OMP MASTER directive 171 171 172 172 USE infotrac_phy, ONLY: nbtr, nqtot, nqo, type_trac, tracers, niso, ntiso … … 291 291 292 292 SUBROUTINE wxios_set_cal(pasdetemps, calendrier, annee, mois, jour, heure, ini_an, ini_mois, ini_jour, ini_heure) 293 USE print_control_mod, ONLY 293 USE print_control_mod, ONLY: prt_level, lunout 294 294 IMPLICIT NONE 295 295 … … 364 364 is_sequential, is_south_pole_dyn 365 365 USE mod_grid_phy_lmdz, only: nbp_lon, nbp_lat, klon_glo 366 USE print_control_mod, ONLY 366 USE print_control_mod, ONLY: prt_level, lunout 367 367 USE geometry_mod 368 368 … … 446 446 447 447 SUBROUTINE wxios_domain_param_unstructured(dom_id) 448 USE geometry_mod, ONLY 449 USE mod_grid_phy_lmdz, ONLY 448 USE geometry_mod, ONLY: longitude, latitude, boundslon, boundslat,ind_cell_glo 449 USE mod_grid_phy_lmdz, ONLY: nvertex, klon_glo 450 450 USE mod_phys_lmdz_para 451 USE nrtype, ONLY 452 USE ioipsl_getin_p_mod, ONLY 451 USE nrtype, ONLY: PI 452 USE ioipsl_getin_p_mod, ONLY: getin_p 453 453 IMPLICIT NONE 454 454 CHARACTER(len=*),INTENT(IN) :: dom_id ! domain identifier … … 501 501 SUBROUTINE wxios_add_vaxis(axis_id, axis_size, axis_value, & 502 502 positif, bnds) 503 USE print_control_mod, ONLY 503 USE print_control_mod, ONLY: prt_level, lunout 504 504 IMPLICIT NONE 505 505 … … 558 558 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! 559 559 SUBROUTINE wxios_add_file(fname, ffreq, flvl) 560 USE print_control_mod, ONLY 560 USE print_control_mod, ONLY: prt_level, lunout 561 561 IMPLICIT NONE 562 562 … … 642 642 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! 643 643 SUBROUTINE wxios_add_field_to_file(fieldname, fdim, fid, fname, fieldlongname, fieldunit, field_level, op, nam_axvert) 644 USE print_control_mod, ONLY 644 USE print_control_mod, ONLY: prt_level, lunout 645 645 IMPLICIT NONE 646 646 -
LMDZ6/branches/Amaury_dev/libf/misc/xercnt.F
r2197 r5101 16 16 C Just after each message is recorded, but before it is 17 17 C processed any further (i.e., before it is printed or 18 C a decision to abort is made), a callis made to XERCNT.18 C a decision to abort is made), a CALL is made to XERCNT. 19 19 C If the user has provided his own version of XERCNT, he 20 20 C can then override the value of KONTROL used in processing … … 32 32 C SUBROU - the subroutine that XERMSG is being called from 33 33 C MESSG - the first 20 characters of the error message. 34 C NERR - same as in the callto XERMSG.35 C LEVEL - same as in the callto XERMSG.34 C NERR - same as in the CALL to XERMSG. 35 C LEVEL - same as in the CALL to XERMSG. 36 36 C KONTRL - the current value of the control flag as set 37 C by a callto XSETF.37 C by a CALL to XSETF. 38 38 C 39 39 C --Output-- -
LMDZ6/branches/Amaury_dev/libf/misc/xermsg.F
r5086 r5101 135 135 C Each of the arguments to XERMSG is input; none will be modified by 136 136 C XERMSG. A routine may make multiple calls to XERMSG with warning 137 C level messages; however, after a callto XERMSG with a recoverable137 C level messages; however, after a CALL to XERMSG with a recoverable 138 138 C error, the routine should return to the user. Do not try to call 139 139 C XERMSG with a second recoverable error after the first recoverable … … 145 145 C This is considered harmless for error numbers associated with 146 146 C warning messages but must not be done for error numbers of serious 147 C errors. After a callto XERMSG with a recoverable error, the user148 C must be given a chance to callNUMXER or XERCLR to retrieve or147 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 149 149 C clear the error number. 150 150 C***REFERENCES R. E. Jones and D. K. Kahaner, XERROR, the SLATEC -
LMDZ6/branches/Amaury_dev/libf/misc/xgetua.F
r5086 r5101 15 15 C XGETUA may be called to determine the unit number or numbers 16 16 C to which error messages are being sent. 17 C These unit numbers may have been set by a callto XSETUN,18 C or a callto XSETUA, or may be a default value.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. 19 19 C 20 20 C Description of Parameters
Note: See TracChangeset
for help on using the changeset viewer.