summaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/host_assoc_function_3.f90
diff options
context:
space:
mode:
Diffstat (limited to 'gcc/testsuite/gfortran.dg/host_assoc_function_3.f90')
-rw-r--r--gcc/testsuite/gfortran.dg/host_assoc_function_3.f902
1 files changed, 1 insertions, 1 deletions
diff --git a/gcc/testsuite/gfortran.dg/host_assoc_function_3.f90 b/gcc/testsuite/gfortran.dg/host_assoc_function_3.f90
index cebe646fa58..cb898bc48ec 100644
--- a/gcc/testsuite/gfortran.dg/host_assoc_function_3.f90
+++ b/gcc/testsuite/gfortran.dg/host_assoc_function_3.f90
@@ -9,7 +9,7 @@ MODULE m
REAL :: x(3) = (/ 1.5, 2.5, 3.5 /)
CONTAINS
SUBROUTINE s
- if (x(2) .eq. 2.5) call abort ()
+ if (x(2) .eq. 2.5) STOP 1
CONTAINS
FUNCTION x(n, m)
integer, optional :: m