Ignore:
Timestamp:
Jul 2, 2025, 12:00:08 PM (2 days ago)
Author:
dcugnet
Message:
  • Use REAL(KIND=REAL32) and REAL(KIND=REAL64) Iinstead of REAL and DOUBLE PRECISION

to avoid ambiguity problems in generic procedure when reals are promoted to doubles.

  • generic "num2str" replaces "str2int", "str2real", "str2dble" and "str2bool" functions.
File:
1 edited

Legend:

Unmodified
Added
Removed
  • LMDZ6/trunk/libf/dyn3d/dynetat0.f90

    r5285 r5748  
    1010  USE infotrac,    ONLY: nqtot, tracers, niso, iqIsoPha, iH2O, isoName, &
    1111                         new2oldH2O, newHNO3, oldHNO3
    12   USE strings_mod, ONLY: maxlen, msg, strStack, real2str, int2str
     12  USE strings_mod, ONLY: maxlen, msg, strStack, num2str
    1313  USE netcdf,      ONLY: NF90_OPEN,  NF90_NOWRITE, NF90_INQ_VARID, &
    1414                         NF90_CLOSE, NF90_GET_VAR, NF90_NoErr
     
    107107
    108108!-------------------------------------------------------------------------------
    109   CALL msg('rad, omeg, g, cpp, kappa = '//TRIM(strStack(real2str([rad,omeg,g,cpp,kappa]))), modname)
     109  CALL msg('rad, omeg, g, cpp, kappa = '//TRIM(strStack(num2str([rad,omeg,g,cpp,kappa]))), modname)
    110110  CALL check_dim(im,iim,'im','im')
    111111  CALL check_dim(jm,jjm,'jm','jm')
     
    210210  CHARACTER(LEN=*), INTENT(IN) :: str1, str2
    211211  CHARACTER(LEN=maxlen) :: s1, s2
    212   IF(n1/=n2) CALL abort_gcm(TRIM(modname), 'value of "'//TRIM(str1)//'" = '//TRIM(int2str(n1))// &
    213    ' read in starting file differs from gcm value of "'//TRIM(str2)//'" = '//TRIM(int2str(n2)), 1)
     212  IF(n1/=n2) CALL abort_gcm(TRIM(modname), 'value of "'//TRIM(str1)//'" = '//TRIM(num2str(n1))// &
     213   ' read in starting file differs from gcm value of "'//TRIM(str2)//'" = '//TRIM(num2str(n2)), 1)
    214214END SUBROUTINE check_dim
    215215
Note: See TracChangeset for help on using the changeset viewer.