summaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/class_to_type_1.f03
diff options
context:
space:
mode:
Diffstat (limited to 'gcc/testsuite/gfortran.dg/class_to_type_1.f03')
-rw-r--r--gcc/testsuite/gfortran.dg/class_to_type_1.f0332
1 files changed, 16 insertions, 16 deletions
diff --git a/gcc/testsuite/gfortran.dg/class_to_type_1.f03 b/gcc/testsuite/gfortran.dg/class_to_type_1.f03
index 0243343d637..f9de0762be0 100644
--- a/gcc/testsuite/gfortran.dg/class_to_type_1.f03
+++ b/gcc/testsuite/gfortran.dg/class_to_type_1.f03
@@ -17,17 +17,17 @@ class(t), allocatable :: x(:)
allocate(t2 :: x(10))
select type(x)
type is(t2)
- if (size (x) /= 10) call abort ()
+ if (size (x) /= 10) STOP 1
x = [(t2(a=-i, B=[1*i,2*i,3*i,4*i]), i = 1, 10)]
do i = 1, 10
if (x(i)%a /= -i .or. size (x(i)%b) /= 4 &
.or. any (x(i)%b /= [1*i,2*i,3*i,4*i])) then
- call abort()
+ STOP 2
end if
- if (x(i)%z /= cmplx(3.3, 4.4)) call abort()
+ if (x(i)%z /= cmplx(3.3, 4.4)) STOP 3
end do
class default
- call abort()
+ STOP 4
end select
call base(x)
@@ -37,22 +37,22 @@ call classExplicit(x, size(x))
contains
subroutine base(y)
type(t) :: y(:)
- if (size (y) /= 10) call abort ()
+ if (size (y) /= 10) STOP 5
do i = 1, 10
if (y(i)%a /= -i .or. size (y(i)%b) /= 4 &
.or. any (y(i)%b /= [1*i,2*i,3*i,4*i])) then
- call abort()
+ STOP 6
end if
end do
end subroutine base
subroutine baseExplicit(v, n)
integer, intent(in) :: n
type(t) :: v(n)
- if (size (v) /= 10) call abort ()
+ if (size (v) /= 10) STOP 7
do i = 1, 10
if (v(i)%a /= -i .or. size (v(i)%b) /= 4 &
.or. any (v(i)%b /= [1*i,2*i,3*i,4*i])) then
- call abort()
+ STOP 8
end if
end do
end subroutine baseExplicit
@@ -60,16 +60,16 @@ contains
class(t), intent(in) :: z(:)
select type(z)
type is(t2)
- if (size (z) /= 10) call abort ()
+ if (size (z) /= 10) STOP 9
do i = 1, 10
if (z(i)%a /= -i .or. size (z(i)%b) /= 4 &
.or. any (z(i)%b /= [1*i,2*i,3*i,4*i])) then
- call abort()
+ STOP 10
end if
- if (z(i)%z /= cmplx(3.3, 4.4)) call abort()
+ if (z(i)%z /= cmplx(3.3, 4.4)) STOP 11
end do
class default
- call abort()
+ STOP 12
end select
call base(z)
call baseExplicit(z, size(z))
@@ -79,16 +79,16 @@ contains
class(t), intent(in) :: u(n)
select type(u)
type is(t2)
- if (size (u) /= 10) call abort ()
+ if (size (u) /= 10) STOP 13
do i = 1, 10
if (u(i)%a /= -i .or. size (u(i)%b) /= 4 &
.or. any (u(i)%b /= [1*i,2*i,3*i,4*i])) then
- call abort()
+ STOP 14
end if
- if (u(i)%z /= cmplx(3.3, 4.4)) call abort()
+ if (u(i)%z /= cmplx(3.3, 4.4)) STOP 15
end do
class default
- call abort()
+ STOP 16
end select
call base(u)
call baseExplicit(u, n)