summaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/pointer_array_8.f90
diff options
context:
space:
mode:
Diffstat (limited to 'gcc/testsuite/gfortran.dg/pointer_array_8.f90')
-rw-r--r--gcc/testsuite/gfortran.dg/pointer_array_8.f9028
1 files changed, 14 insertions, 14 deletions
diff --git a/gcc/testsuite/gfortran.dg/pointer_array_8.f90 b/gcc/testsuite/gfortran.dg/pointer_array_8.f90
index bbf2c997dd6..3bb2a1bbecc 100644
--- a/gcc/testsuite/gfortran.dg/pointer_array_8.f90
+++ b/gcc/testsuite/gfortran.dg/pointer_array_8.f90
@@ -22,37 +22,37 @@
tgt = [(thytype(int(i), i, mytype(int(2*i), 2*i)), i= 1,3)]
cptr => tgt%i
- if (lbound (cptr, 1) .ne. 1) Call abort ! Not a whole array target!
+ if (lbound (cptr, 1) .ne. 1) STOP 1! Not a whole array target!
s1 = loc(cptr)
call foo (cptr, s2) ! Check bounds not changed...
- if (s1 .ne. s2) Call abort ! ...and that the descriptor is passed.
+ if (s1 .ne. s2) STOP 2! ...and that the descriptor is passed.
select type (cptr)
type is (integer)
- if (any (cptr .ne. [1,2,3])) call abort ! Check the the scalarizer works.
- if (cptr(2) .ne. 2) call abort ! Check ordinary array indexing.
+ if (any (cptr .ne. [1,2,3])) STOP 3! Check the the scalarizer works.
+ if (cptr(2) .ne. 2) STOP 4! Check ordinary array indexing.
end select
cptr(1:3) => tgt%der%r ! Something a tad more complicated!
select type (cptr)
type is (real)
- if (any (int(cptr) .ne. [2,4,6])) call abort
- if (any (int(cptr([2,3,1])) .ne. [4,6,2])) call abort
- if (int(cptr(3)) .ne. 6) call abort
+ if (any (int(cptr) .ne. [2,4,6])) STOP 5
+ if (any (int(cptr([2,3,1])) .ne. [4,6,2])) STOP 6
+ if (int(cptr(3)) .ne. 6) STOP 7
end select
cptr1(1:3) => tgt%der
s1 = loc(cptr1)
call bar(cptr1, s2)
- if (s1 .ne. s2) Call abort ! Check that the descriptor is passed.
+ if (s1 .ne. s2) STOP 8! Check that the descriptor is passed.
select type (cptr1)
type is (mytype)
- if (any (cptr1%i .ne. [2,4,6])) call abort
- if (cptr1(2)%i .ne. 4) call abort
+ if (any (cptr1%i .ne. [2,4,6])) STOP 9
+ if (cptr1(2)%i .ne. 4) STOP 10
end select
contains
@@ -63,8 +63,8 @@ contains
addr = loc(arg)
select type (arg)
type is (integer)
- if (any (arg .ne. [1,2,3])) call abort ! Check the the scalarizer works.
- if (arg(2) .ne. 2) call abort ! Check ordinary array indexing.
+ if (any (arg .ne. [1,2,3])) STOP 11! Check the the scalarizer works.
+ if (arg(2) .ne. 2) STOP 12! Check ordinary array indexing.
end select
end subroutine
@@ -74,8 +74,8 @@ contains
addr = loc(arg)
select type (arg)
type is (mytype)
- if (any (arg%i .ne. [2,4,6])) call abort
- if (arg(2)%i .ne. 4) call abort
+ if (any (arg%i .ne. [2,4,6])) STOP 13
+ if (arg(2)%i .ne. 4) STOP 14
end select
end subroutine
end