Ignore:
Timestamp:
Jul 24, 2024, 4:23:34 PM (2 months ago)
Author:
abarral
Message:

rename modules properly lmdz_*
move some unused files to obsolete/
(lint) uppercase fortran keywords

File:
1 edited

Legend:

Unmodified
Added
Removed
  • LMDZ6/branches/Amaury_dev/libf/dyn3dmem/wrgrads.f90

    r5116 r5117  
    2424  INTEGER :: im, jm, lm, i, j, l, iv, iii, iji, iif, ijf
    2525
    26   logical :: writectl
     26  LOGICAL :: writectl
    2727
    2828  writectl = .FALSE.
     
    6363  else
    6464    ivar(if) = mod(ivar(if), nvar(if)) + 1
    65     if (ivar(if)==nvar(if)) THEN
     65    IF (ivar(if)==nvar(if)) THEN
    6666      writectl = .TRUE.
    6767      itime(if) = itime(if) + 1
     
    7777      CALL abort_gcm("wrgrads", "problem", 1)
    7878    endif
    79   endif
     79  ENDIF
    8080
    8181  PRINT*, 'ivar(if),nvar(if),var(ivar(if),if),writectl'
     
    9090                    , i = iii, iif), j = iji, ijf)
    9191  enddo
    92   if (writectl) THEN
     92  IF (writectl) THEN
    9393    file = fichier(if)
    9494    !   WARNING! on reecrase le fichier .ctl a chaque ecriture
     
    118118    close(unit(if))
    119119
    120   endif ! writectl
     120  ENDIF ! writectl
    121121
    122122END SUBROUTINE wrgrads
Note: See TracChangeset for help on using the changeset viewer.