RISC-V: Regenerate opt urls.
[official-gcc.git] / gcc / testsuite / gfortran.dg / class_array_16.f90
blob14ed8426936cd2d112474c36c027ee80f25819a5
1 ! { dg-do run }
2 ! { dg-options "-fdump-tree-original" }
4 module m
5 implicit none
6 type t
7 end type t
9 type, extends(t) :: t2
10 end type t2
12 type(t) :: var_t
13 type(t2) :: var_t2
14 contains
15 subroutine sub(x)
16 class(t), allocatable, intent(out) :: x(:)
18 if (allocated (x)) STOP 1
19 if (.not. same_type_as(x, var_t)) STOP 2
21 allocate (t2 :: x(5))
22 end subroutine sub
24 subroutine sub2(x)
25 class(t), allocatable, OPTIONAL, intent(out) :: x(:)
27 if (.not. present(x)) return
28 if (allocated (x)) STOP 3
29 if (.not. same_type_as(x, var_t)) STOP 4
31 allocate (t2 :: x(5))
32 end subroutine sub2
33 end module m
35 use m
36 implicit none
37 class(t), save, allocatable :: y(:)
39 if (allocated (y)) STOP 5
40 if (.not. same_type_as(y,var_t)) STOP 6
42 call sub(y)
43 if (.not.allocated(y)) STOP 7
44 if (.not. same_type_as(y, var_t2)) STOP 8
45 if (size (y) /= 5) STOP 9
47 call sub(y)
48 if (.not.allocated(y)) STOP 10
49 if (.not. same_type_as(y, var_t2)) STOP 11
50 if (size (y) /= 5) STOP 12
52 deallocate (y)
53 if (allocated (y)) STOP 13
54 if (.not. same_type_as(y,var_t)) STOP 14
56 call sub2()
58 call sub2(y)
59 if (.not.allocated(y)) STOP 15
60 if (.not. same_type_as(y, var_t2)) STOP 16
61 if (size (y) /= 5) STOP 17
63 call sub2(y)
64 if (.not.allocated(y)) STOP 18
65 if (.not. same_type_as(y, var_t2)) STOP 19
66 if (size (y) /= 5) STOP 20
67 end
69 ! { dg-final { scan-tree-dump-times "__builtin_free" 5 "original" } }
70 ! { dg-final { scan-tree-dump-times "finally" 0 "original" } }