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_common/gr_int_dyn.f90

    r5245 r5246  
    22! $Header$
    33!
    4       subroutine gr_int_dyn(champin,champdyn,iim,jp1)
    5       implicit none
    6 c=======================================================================
    7 c   passage d'un champ interpole a un champ sur grille scalaire
    8 c=======================================================================
    9 c-----------------------------------------------------------------------
    10 c   declarations:
    11 c   -------------
     4subroutine gr_int_dyn(champin,champdyn,iim,jp1)
     5  implicit none
     6  !=======================================================================
     7  !   passage d'un champ interpole a un champ sur grille scalaire
     8  !=======================================================================
     9  !-----------------------------------------------------------------------
     10  !   declarations:
     11  !   -------------
    1212
    13       INTEGER iim
    14       integer ip1, jp1
    15       REAL champin(iim, jp1)
    16       REAL champdyn(iim+1, jp1)
     13  INTEGER :: iim
     14  integer :: ip1, jp1
     15  REAL :: champin(iim, jp1)
     16  REAL :: champdyn(iim+1, jp1)
    1717
    18       INTEGER i, j
    19       real polenord, polesud
     18  INTEGER :: i, j
     19  real :: polenord, polesud
    2020
    21 c-----------------------------------------------------------------------
    22 c   calcul:
    23 c   -------
     21  !-----------------------------------------------------------------------
     22  !   calcul:
     23  !   -------
    2424
    25       ip1 = iim + 1
    26       polenord = 0.
    27       polesud = 0.
    28       do i = 1, iim
    29         polenord = polenord + champin (i, 1)
    30         polesud = polesud + champin (i, jp1)
    31       enddo
    32       polenord = polenord / iim
    33       polesud = polesud / iim
    34       do j = 1, jp1
    35         do i = 1, iim
    36           if (j .eq. 1) then
    37             champdyn(i, j) = polenord
    38           else if (j .eq. jp1) then
    39             champdyn(i, j) = polesud
    40           else
    41             champdyn(i, j) = champin (i, j)
    42           endif
    43         enddo
    44         champdyn(ip1, j) = champdyn(1, j)
    45       enddo
     25  ip1 = iim + 1
     26  polenord = 0.
     27  polesud = 0.
     28  do i = 1, iim
     29    polenord = polenord + champin (i, 1)
     30    polesud = polesud + champin (i, jp1)
     31  enddo
     32  polenord = polenord / iim
     33  polesud = polesud / iim
     34  do j = 1, jp1
     35    do i = 1, iim
     36      if (j .eq. 1) then
     37        champdyn(i, j) = polenord
     38      else if (j .eq. jp1) then
     39        champdyn(i, j) = polesud
     40      else
     41        champdyn(i, j) = champin (i, j)
     42      endif
     43    enddo
     44    champdyn(ip1, j) = champdyn(1, j)
     45  enddo
    4646
    47       RETURN
    48       END
     47  RETURN
     48END SUBROUTINE gr_int_dyn
    4949
Note: See TracChangeset for help on using the changeset viewer.