Ignore:
Timestamp:
04/24/23 10:37:26 (14 months ago)
Author:
dumas
Message:

Updating the file indentation of moy_mxmy.f90

File:
1 edited

Legend:

Unmodified
Added
Removed
  • branches/GRISLIv3/SOURCES/moy_mxmy.f90

    r71 r417  
    1717!< 
    1818subroutine moy_mxmy(n1,n2,X2D,X_mx,X_my) 
    19 ! fait la moyenne ponderee d'un tableau X2D sur les mailles staggered 
    20  !$ USE OMP_LIB 
    21 implicit none 
    22 integer, intent(in) :: n1,n2   !< dimension des tableaux 
    23 real, dimension(n1,n2),intent(in) :: X2D   !< tableau sur les noeuds majeurs 
    24 real, dimension(n1,n2),intent(out) :: X_mx  !< tableau sur les noeuds mineurs x 
    25 real, dimension(n1,n2),intent(out) :: X_my  !< tableau sur les noeuds mineurs y 
     19  ! fait la moyenne ponderee d'un tableau X2D sur les mailles staggered 
     20  !$ USE OMP_LIB 
     21  implicit none 
     22  integer, intent(in) :: n1,n2   !< dimension des tableaux 
     23  real, dimension(n1,n2),intent(in) :: X2D   !< tableau sur les noeuds majeurs 
     24  real, dimension(n1,n2),intent(out) :: X_mx  !< tableau sur les noeuds mineurs x 
     25  real, dimension(n1,n2),intent(out) :: X_my  !< tableau sur les noeuds mineurs y 
    2626 
    27 integer :: i,j 
    28 integer :: i_moins1,j_moins1,i_plus1,j_plus1 
     27  integer :: i,j 
     28  integer :: i_moins1,j_moins1,i_plus1,j_plus1 
    2929 
    3030 
    3131  !$OMP PARALLEL PRIVATE(i_moins1,j_moins1,i_plus1,j_plus1) 
    3232  !$OMP DO 
    33         do j=1,n2 
    34                 do i=1,n1 
    35                         i_moins1=max(1,i-1) 
    36                         j_moins1=max(1,j-1) 
    37                         i_plus1=min(n1,i+1) 
    38                         j_plus1=min(n2,j+1) 
     33  do j=1,n2 
     34     do i=1,n1 
     35        i_moins1=max(1,i-1) 
     36        j_moins1=max(1,j-1) 
     37        i_plus1=min(n1,i+1) 
     38        j_plus1=min(n2,j+1) 
    3939 
    40                         X_mx(i,j)=0.25*(X2D(i,j)+X2D(i_moins1,j)) & 
    41            + 0.125*((X2D(i_moins1,j_plus1)+X2D(i,j_plus1))   & 
    42            +       (X2D(i_moins1,j_moins1)+X2D(i,j_moins1))) 
     40        X_mx(i,j)=0.25*(X2D(i,j)+X2D(i_moins1,j)) & 
     41             + 0.125*((X2D(i_moins1,j_plus1)+X2D(i,j_plus1))   & 
     42             +       (X2D(i_moins1,j_moins1)+X2D(i,j_moins1))) 
    4343 
    44                         X_my(i,j)=0.25*(X2D(i,j)+X2D(i,j_moins1)) & 
    45            + 0.125*((X2D(i_plus1,j_moins1)+X2D(i_plus1,j))   & 
    46            +       (X2D(i_moins1,j_moins1)+X2D(i_moins1,j))) 
    47                 end do 
    48         end do 
     44        X_my(i,j)=0.25*(X2D(i,j)+X2D(i,j_moins1)) & 
     45             + 0.125*((X2D(i_plus1,j_moins1)+X2D(i_plus1,j))   & 
     46             +       (X2D(i_moins1,j_moins1)+X2D(i_moins1,j))) 
     47     end do 
     48  end do 
    4949  !$OMP END DO 
    5050  !$OMP END PARALLEL 
    5151 
    52 return 
     52  return 
    5353end subroutine moy_mxmy 
    5454 
Note: See TracChangeset for help on using the changeset viewer.