summaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/c_by_val_5.f90
diff options
context:
space:
mode:
Diffstat (limited to 'gcc/testsuite/gfortran.dg/c_by_val_5.f90')
-rw-r--r--gcc/testsuite/gfortran.dg/c_by_val_5.f9016
1 files changed, 8 insertions, 8 deletions
diff --git a/gcc/testsuite/gfortran.dg/c_by_val_5.f90 b/gcc/testsuite/gfortran.dg/c_by_val_5.f90
index 3a8bc3bf750..bbef6bda892 100644
--- a/gcc/testsuite/gfortran.dg/c_by_val_5.f90
+++ b/gcc/testsuite/gfortran.dg/c_by_val_5.f90
@@ -9,9 +9,9 @@
subroutine bmp_write(nx)
implicit none
integer, value :: nx
- if(nx /= 10) call abort()
+ if(nx /= 10) STOP 1
nx = 11
- if(nx /= 11) call abort()
+ if(nx /= 11) STOP 2
end subroutine bmp_write
module x
@@ -29,9 +29,9 @@ module x
contains
SUBROUTINE Grid2BMP(NX)
INTEGER, INTENT(IN) :: NX
- if(nx /= 10) call abort()
+ if(nx /= 10) STOP 3
call bmp_write(%val(nx))
- if(nx /= 10) call abort()
+ if(nx /= 10) STOP 4
END SUBROUTINE Grid2BMP
END module x
@@ -46,15 +46,15 @@ END module x
! implicit none
! integer :: n
! n = 5
-! if(n /= 5) call abort()
+! if(n /= 5) STOP 5
! call test2(%VAL(n))
-! if(n /= 5) call abort()
+! if(n /= 5) STOP 6
! contains
! subroutine test2(a)
! integer, value :: a
-! if(a /= 5) call abort()
+! if(a /= 5) STOP 7
! a = 2
-! if(a /= 2) call abort()
+! if(a /= 2) STOP 8
! end subroutine test2
!end subroutine test