Ignore:
Timestamp:
Jul 24, 2024, 2:54:37 PM (2 months ago)
Author:
abarral
Message:

rename modules properly lmdz_*
move ismin, ismax, minmax into new lmdz_libmath.f90
(lint) uppercase fortran keywords

File:
1 edited

Legend:

Unmodified
Added
Removed
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/writehist.f90

    r5114 r5116  
    4747  REAL :: phis(ip1jmp1)
    4848  REAL :: q(ip1jmp1, llm, nqtot)
    49   integer :: time
     49  INTEGER :: time
    5050
    5151
     
    5353  !   Variables locales
    5454  !
    55   integer :: iq, ii, ll
    56   integer :: ndexu(ip1jmp1 * llm), ndexv(ip1jm * llm), ndex2d(ip1jmp1)
     55  INTEGER :: iq, ii, ll
     56  INTEGER :: ndexu(ip1jmp1 * llm), ndexv(ip1jm * llm), ndex2d(ip1jmp1)
    5757  logical :: ok_sync
    58   integer :: itau_w
     58  INTEGER :: itau_w
    5959  REAL :: vnat(ip1jm, llm), unat(ip1jmp1, llm)
    6060
     
    114114  !  Fin
    115115  !
    116   if (ok_sync) then
     116  if (ok_sync) THEN
    117117    CALL histsync(histid)
    118118    CALL histsync(histvid)
    119119    CALL histsync(histuid)
    120120  endif
    121   return
    122 end subroutine writehist
     121  RETURN
     122END SUBROUTINE writehist
Note: See TracChangeset for help on using the changeset viewer.