summaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/allocate_with_source_23.f03
diff options
context:
space:
mode:
Diffstat (limited to 'gcc/testsuite/gfortran.dg/allocate_with_source_23.f03')
-rw-r--r--gcc/testsuite/gfortran.dg/allocate_with_source_23.f0328
1 files changed, 14 insertions, 14 deletions
diff --git a/gcc/testsuite/gfortran.dg/allocate_with_source_23.f03 b/gcc/testsuite/gfortran.dg/allocate_with_source_23.f03
index cfe8bd80e2f..c47e6304998 100644
--- a/gcc/testsuite/gfortran.dg/allocate_with_source_23.f03
+++ b/gcc/testsuite/gfortran.dg/allocate_with_source_23.f03
@@ -22,17 +22,17 @@ subroutine test_class_correct()
class(t), allocatable, dimension(:) :: a, b
allocate(tt::a(1:2))
a(:)%i = [ 1,2 ]
- if (size(a) /= 2) call abort()
- if (any(a(:)%i /= [ 1,2])) call abort()
+ if (size(a) /= 2) STOP 1
+ if (any(a(:)%i /= [ 1,2])) STOP 2
allocate(b(1:4), source=a(1))
- if (size(b) /= 4) call abort()
- if (any(b(:)%i /= [ 1,1,1,1])) call abort()
- select type (b(1))
+ if (size(b) /= 4) STOP 3
+ if (any(b(:)%i /= [ 1,1,1,1])) STOP 4
+ select type (b1 => b(1))
class is (tt)
continue
class default
- call abort()
+ STOP 5
end select
end subroutine
@@ -40,27 +40,27 @@ subroutine test_class_fail()
class(t), allocatable, dimension(:) :: a, b
allocate(tt::a(1:2))
a(:)%i = [ 1,2 ]
- if (size(a) /= 2) call abort()
- if (any(a(:)%i /= [ 1,2])) call abort()
+ if (size(a) /= 2) STOP 6
+ if (any(a(:)%i /= [ 1,2])) STOP 7
allocate(b(1:4), source=a) ! Fail expected: sizes do not conform
- if (size(b) /= 4) call abort()
- if (any(b(1:2)%i /= [ 1,2])) call abort()
- select type (b(1))
+ if (size(b) /= 4) STOP 8
+ if (any(b(1:2)%i /= [ 1,2])) STOP 9
+ select type (b1 => b(1))
class is (tt)
continue
class default
- call abort()
+ STOP 10
end select
end subroutine
subroutine test_type()
type(t), allocatable, dimension(:) :: a, b
allocate(a(1:2))
- if (size(a) /= 2) call abort()
+ if (size(a) /= 2) STOP 11
allocate(b(1:4), source=a)
- if (size(b) /= 4) call abort()
+ if (size(b) /= 4) STOP 12
end subroutine
end program allocate_source