summaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/allocatable_scalar_4.f90
diff options
context:
space:
mode:
Diffstat (limited to 'gcc/testsuite/gfortran.dg/allocatable_scalar_4.f90')
-rw-r--r--gcc/testsuite/gfortran.dg/allocatable_scalar_4.f9048
1 files changed, 24 insertions, 24 deletions
diff --git a/gcc/testsuite/gfortran.dg/allocatable_scalar_4.f90 b/gcc/testsuite/gfortran.dg/allocatable_scalar_4.f90
index 9f7a7a07d70..57afbd4eccd 100644
--- a/gcc/testsuite/gfortran.dg/allocatable_scalar_4.f90
+++ b/gcc/testsuite/gfortran.dg/allocatable_scalar_4.f90
@@ -9,57 +9,57 @@ program test
integer, allocatable :: b
allocate(a)
call foo(a)
- if(.not. allocated(a)) call abort()
- if (a /= 5) call abort()
+ if(.not. allocated(a)) STOP 1
+ if (a /= 5) STOP 2
call bar(a)
- if (a /= 7) call abort()
+ if (a /= 7) STOP 3
deallocate(a)
- if(allocated(a)) call abort()
+ if(allocated(a)) STOP 4
call check3(a)
- if(.not. allocated(a)) call abort()
- if(a /= 6874) call abort()
+ if(.not. allocated(a)) STOP 5
+ if(a /= 6874) STOP 6
call check4(a)
- if(.not. allocated(a)) call abort()
- if(a /= -478) call abort()
+ if(.not. allocated(a)) STOP 7
+ if(a /= -478) STOP 8
allocate(b)
b = 7482
call checkOptional(.false.,.true., 7482)
- if (b /= 7482) call abort()
+ if (b /= 7482) STOP 9
call checkOptional(.true., .true., 7482, b)
- if (b /= 46) call abort()
+ if (b /= 46) STOP 10
contains
subroutine foo(a)
integer, allocatable, intent(out) :: a
- if(allocated(a)) call abort()
+ if(allocated(a)) STOP 11
allocate(a)
a = 5
end subroutine foo
subroutine bar(a)
integer, allocatable, intent(inout) :: a
- if(.not. allocated(a)) call abort()
- if (a /= 5) call abort()
+ if(.not. allocated(a)) STOP 12
+ if (a /= 5) STOP 13
a = 7
end subroutine bar
subroutine check3(a)
integer, allocatable, intent(inout) :: a
- if(allocated(a)) call abort()
+ if(allocated(a)) STOP 14
allocate(a)
a = 6874
end subroutine check3
subroutine check4(a)
integer, allocatable, intent(inout) :: a
- if(.not.allocated(a)) call abort()
- if (a /= 6874) call abort
+ if(.not.allocated(a)) STOP 15
+ if (a /= 6874) STOP 1
deallocate(a)
- if(allocated(a)) call abort()
+ if(allocated(a)) STOP 16
allocate(a)
- if(.not.allocated(a)) call abort()
+ if(.not.allocated(a)) STOP 17
a = -478
end subroutine check4
@@ -67,19 +67,19 @@ contains
logical, intent(in) :: prsnt, alloc
integer, allocatable, optional :: x
integer, intent(in) :: val
- if (present(x) .neqv. prsnt) call abort()
+ if (present(x) .neqv. prsnt) STOP 18
if (present(x)) then
- if (allocated(x) .neqv. alloc) call abort()
+ if (allocated(x) .neqv. alloc) STOP 19
end if
if (present(x)) then
if (allocated(x)) then
- if (x /= val) call abort()
+ if (x /= val) STOP 20
end if
end if
call checkOptional2(x)
if (present(x)) then
- if (.not. allocated(x)) call abort()
- if (x /= -6784) call abort()
+ if (.not. allocated(x)) STOP 21
+ if (x /= -6784) STOP 22
x = 46
end if
call checkOptional2()
@@ -87,7 +87,7 @@ contains
subroutine checkOptional2(x)
integer, allocatable, optional, intent(out) :: x
if (present(x)) then
- if (allocated(x)) call abort()
+ if (allocated(x)) STOP 23
allocate(x)
x = -6784
end if