blob: 648012431acf244a2ff09af9d4a4b43c3deada1f (
plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
|
! { dg-do compile }
!
! ALLOCATE statements with derived type specification
!
! Contributed by Janus Weil <janus@gcc.gnu.org>
type :: t1
integer :: i
end type
type, extends(t1) :: t2
real :: r
end type
type, extends(t2) :: t3
real :: q
end type
type, abstract :: u0
logical :: nothing
end type
type :: v1
real :: r
end type
! FIXME: uncomment and dejagnuify the lines below once class arrays are enabled
! class(t1),dimension(:),allocatable :: x
type(t2),dimension(:),allocatable :: y
! class(t3),dimension(:),allocatable :: z
! allocate( x(1))
! allocate(t1 :: x(2))
! allocate(t2 :: x(3))
! allocate(t3 :: x(4))
! allocate(tx :: x(5)) ! { "Error in type-spec at" }
! allocate(u0 :: x(6)) ! { "may not be ABSTRACT" }
! allocate(v1 :: x(7)) ! { "is type incompatible with typespec" }
allocate( y(1))
allocate(t1 :: y(2)) ! { dg-error "is type incompatible with typespec" }
allocate(t2 :: y(3))
allocate(t3 :: y(3)) ! { dg-error "is type incompatible with typespec" }
! allocate( z(1))
! allocate(t1 :: z(2)) ! { "is type incompatible with typespec" }
! allocate(t2 :: z(3)) ! { "is type incompatible with typespec" }
! allocate(t3 :: z(4))
end
|