summaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/intrinsic_ifunction_1.f90
diff options
context:
space:
mode:
Diffstat (limited to 'gcc/testsuite/gfortran.dg/intrinsic_ifunction_1.f90')
-rw-r--r--gcc/testsuite/gfortran.dg/intrinsic_ifunction_1.f9014
1 files changed, 7 insertions, 7 deletions
diff --git a/gcc/testsuite/gfortran.dg/intrinsic_ifunction_1.f90 b/gcc/testsuite/gfortran.dg/intrinsic_ifunction_1.f90
index a27c220ee46..e1c2ca7ec1c 100644
--- a/gcc/testsuite/gfortran.dg/intrinsic_ifunction_1.f90
+++ b/gcc/testsuite/gfortran.dg/intrinsic_ifunction_1.f90
@@ -17,20 +17,20 @@
lda = (/ (i/2*2 .eq. I, i=1,9) /)
LDA = ALL ( IDA .NE. -1000, 1)
- if (.not. all(lda)) call abort
- if (.not. all(ida .ne. -1000)) call abort
+ if (.not. all(lda)) STOP 1
+ if (.not. all(ida .ne. -1000)) STOP 2
lda = (/ (i/2*2 .eq. I, i=1,9) /)
LDA = any ( IDA .NE. -1000, 1)
print *, lda !expect FALSE
- if (any(lda)) call abort
+ if (any(lda)) STOP 3
print *, any(ida .ne. -1000) !expect FALSE
- if (any(ida .ne. -1000)) call abort
+ if (any(ida .ne. -1000)) STOP 4
iii = 137
iii = count ( IDA .NE. -1000, 1)
- if (any(iii /= 0)) call abort
- if (count(ida .ne. -1000) /= 0) call abort
+ if (any(iii /= 0)) STOP 5
+ if (count(ida .ne. -1000) /= 0) STOP 6
END SUBROUTINE
@@ -39,5 +39,5 @@
integer, dimension(nf0,9) :: ida
res = (/ (-i, i=1,9) /)
res = product (ida, 1)
- if (any(res /= 1)) call abort
+ if (any(res /= 1)) STOP 7
end subroutine foo