aboutsummaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/pointer_intent_8.f90
blob: 6bfbc5c37cc74609c1db848f894a96ce366af1e8 (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
! { dg-do run }
! PR 85797 - this used to get wrong results.


PROGRAM testfortran2
  IMPLICIT NONE

  INTEGER, DIMENSION(10), TARGET :: i4array

  i4array = (/ 1,2,3,4,5,6,7,8,9,10 /)

  call InRef(i4array)

CONTAINS

  subroutine InRef(v)
    INTEGER, DIMENSION(:), POINTER, INTENT(in) :: v
    INTEGER :: i
    if (any (v /= [(i,i=1,10)])) stop 1
  END subroutine

END