Ignore:
Timestamp:
Oct 21, 2024, 2:58:45 PM (23 hours ago)
Author:
abarral
Message:

Convert fixed-form to free-form sources .F -> .{f,F}90
(WIP: some .F remain, will be handled in subsequent commits)

File:
1 moved

Legend:

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

    r5245 r5246  
    22! $Header$
    33!
    4       SUBROUTINE dteta1 ( teta, pbaru, pbarv, dteta)
    5       IMPLICIT NONE
     4SUBROUTINE dteta1 ( teta, pbaru, pbarv, dteta)
     5  IMPLICIT NONE
    66
    7 c=======================================================================
    8 c
    9 c   Auteur:  P. Le Van
    10 c   -------
    11 c Modif F.Forget 03/94 (on retire q et dq  pour construire dteta1)
    12 c
    13 c   ********************************************************************
    14 c   ... calcul du terme de convergence horizontale du flux d'enthalpie
    15 c        potentielle   ......
    16 c   ********************************************************************
    17 c  .. teta,pbaru et pbarv sont des arguments d'entree  pour le s-pg ....
    18 c    dteta               sont des arguments de sortie pour le s-pg ....
    19 c
    20 c=======================================================================
     7  !=======================================================================
     8  !
     9  !   Auteur:  P. Le Van
     10  !   -------
     11  ! Modif F.Forget 03/94 (on retire q et dq  pour construire dteta1)
     12  !
     13  !   ********************************************************************
     14  !   ... calcul du terme de convergence horizontale du flux d'enthalpie
     15  !    potentielle   ......
     16  !   ********************************************************************
     17  !  .. teta,pbaru et pbarv sont des arguments d'entree  pour le s-pg ....
     18  ! dteta                 sont des arguments de sortie pour le s-pg ....
     19  !
     20  !=======================================================================
    2121
    2222
    23       include "dimensions.h"
    24       include "paramet.h"
     23  include "dimensions.h"
     24  include "paramet.h"
    2525
    26       REAL teta( ip1jmp1,llm ),pbaru( ip1jmp1,llm ),pbarv( ip1jm,llm)
    27       REAL dteta( ip1jmp1,llm )
    28       INTEGER  l,ij
     26  REAL :: teta( ip1jmp1,llm ),pbaru( ip1jmp1,llm ),pbarv( ip1jm,llm)
     27  REAL :: dteta( ip1jmp1,llm )
     28  INTEGER :: l,ij
    2929
    30       REAL hbyv( ip1jm,llm ), hbxu( ip1jmp1,llm )
     30  REAL :: hbyv( ip1jm,llm ), hbxu( ip1jmp1,llm )
    3131
    32 c
     32  !
    3333
    34       DO 5 l = 1,llm
     34  DO l = 1,llm
    3535
    36       DO 1  ij = iip2, ip1jm - 1
    37       hbxu(ij,l) = pbaru(ij,l) * 0.5 * ( teta(ij,l) + teta(ij+1,l) )
    38    1  CONTINUE
     36  DO  ij = iip2, ip1jm - 1
     37  hbxu(ij,l) = pbaru(ij,l) * 0.5 * ( teta(ij,l) + teta(ij+1,l) )
     38  END DO
    3939
    40 c    .... correction pour  hbxu(iip1,j,l)  .....
    41 c    ....   hbxu(iip1,j,l)= hbxu(1,j,l) ....
     40  !    .... correction pour  hbxu(iip1,j,l)  .....
     41  !    ....   hbxu(iip1,j,l)= hbxu(1,j,l) ....
    4242
    43 CDIR$ IVDEP
    44       DO 2 ij = iip1+ iip1, ip1jm, iip1
    45       hbxu( ij, l ) = hbxu( ij - iim, l )
    46    2  CONTINUE
     43  !DIR$ IVDEP
     44  DO ij = iip1+ iip1, ip1jm, iip1
     45  hbxu( ij, l ) = hbxu( ij - iim, l )
     46  END DO
    4747
    4848
    49       DO 3 ij = 1,ip1jm
    50       hbyv(ij,l)= pbarv(ij, l)* 0.5 * ( teta(ij, l)+ teta(ij +iip1,l) )
    51    3  CONTINUE
     49  DO ij = 1,ip1jm
     50  hbyv(ij,l)= pbarv(ij, l)* 0.5 * ( teta(ij, l)+ teta(ij +iip1,l) )
     51  END DO
    5252
    53    5  CONTINUE
     53  END DO
    5454
    5555
    56         CALL  convflu ( hbxu, hbyv, llm, dteta )
     56    CALL  convflu ( hbxu, hbyv, llm, dteta )
    5757
    5858
    59 c    stockage dans  dh de la convergence horizont. filtree' du  flux
    60 c                  ....                           ...........
    61 c          d'enthalpie potentielle .
     59  !    stockage dans  dh de la convergence horizont. filtree' du  flux
     60               ! ....                           ...........
     61        ! d'enthalpie potentielle .
    6262
    63       CALL filtreg( dteta, jjp1, llm, 2, 2, .true., 1)
     63  CALL filtreg( dteta, jjp1, llm, 2, 2, .true., 1)
    6464
    65 c
    66       RETURN
    67       END
     65  !
     66  RETURN
     67END SUBROUTINE dteta1
Note: See TracChangeset for help on using the changeset viewer.