diff options
Diffstat (limited to 'gcc/testsuite/gfortran.dg/host_assoc_function_1.f90')
-rw-r--r-- | gcc/testsuite/gfortran.dg/host_assoc_function_1.f90 | 8 |
1 files changed, 4 insertions, 4 deletions
diff --git a/gcc/testsuite/gfortran.dg/host_assoc_function_1.f90 b/gcc/testsuite/gfortran.dg/host_assoc_function_1.f90 index dffaa93333a..f0e0bb9198b 100644 --- a/gcc/testsuite/gfortran.dg/host_assoc_function_1.f90 +++ b/gcc/testsuite/gfortran.dg/host_assoc_function_1.f90 @@ -19,14 +19,14 @@ MODULE m end interface CONTAINS SUBROUTINE s - if (x(2, 3) .ne. real (2)**3) call abort () - if (z(3, 3) .ne. real (3)**3) call abort () + if (x(2, 3) .ne. real (2)**3) STOP 1 + if (z(3, 3) .ne. real (3)**3) STOP 2 CALL inner CONTAINS SUBROUTINE inner i = 7 - if (x(i, 7) .ne. real (7)**7) call abort () - if (z(i, 7) .ne. real (7)**7) call abort () + if (x(i, 7) .ne. real (7)**7) STOP 3 + if (z(i, 7) .ne. real (7)**7) STOP 4 END SUBROUTINE FUNCTION x(n, m) x = REAL(n)**m |