summaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/protected_2.f90
diff options
context:
space:
mode:
Diffstat (limited to 'gcc/testsuite/gfortran.dg/protected_2.f90')
-rw-r--r--gcc/testsuite/gfortran.dg/protected_2.f9010
1 files changed, 5 insertions, 5 deletions
diff --git a/gcc/testsuite/gfortran.dg/protected_2.f90 b/gcc/testsuite/gfortran.dg/protected_2.f90
index c00222d08b2..1ea59e35609 100644
--- a/gcc/testsuite/gfortran.dg/protected_2.f90
+++ b/gcc/testsuite/gfortran.dg/protected_2.f90
@@ -1,5 +1,5 @@
! { dg-do run }
-! { dg-options "-std=f2003 -fall-intrinsics" }
+! { dg-options "-std=f2003 " }
! PR fortran/23994
!
! Test PROTECTED attribute. Within the module everything is allowed.
@@ -23,7 +23,7 @@ contains
allocate(ap)
ap = 73
call increment(a,ap,at)
- if(a /= 44 .or. ap /= 74 .or. at /= 4) call abort()
+ if(a /= 44 .or. ap /= 74 .or. at /= 4) STOP 1
end subroutine setValue
subroutine increment(a1,a2,a3)
integer, intent(inout) :: a1, a2, a3
@@ -37,9 +37,9 @@ program main
use protmod
implicit none
call setValue()
- if(a /= 44 .or. ap /= 74 .or. at /= 4) call abort()
+ if(a /= 44 .or. ap /= 74 .or. at /= 4) STOP 2
call plus5(ap)
- if(a /= 44 .or. ap /= 79 .or. at /= 4) call abort()
+ if(a /= 44 .or. ap /= 79 .or. at /= 4) STOP 3
call checkVal(a,ap,at)
contains
subroutine plus5(j)
@@ -48,6 +48,6 @@ contains
end subroutine plus5
subroutine checkVal(x,y,z)
integer, intent(in) :: x, y, z
- if(a /= 44 .or. ap /= 79 .or. at /= 4) call abort()
+ if(a /= 44 .or. ap /= 79 .or. at /= 4) STOP 4
end subroutine
end program main