2017-11-05 Paul Thomas <pault@gcc.gnu.org>
[official-gcc.git] / gcc / testsuite / gfortran.dg / finalize_28.f90
blobf0c9665252f46a455fe8877b0dae51f9af381e02
1 ! { dg-do compile }
2 ! { dg-options "-fdump-tree-original" }
4 ! Test the fix for PR64932.
6 ! Reported by Daniel Shapiro <shapero@uw.edu>
8 module coo_graphs
9 implicit none
10 type :: dynamic_array
11 integer :: length, capacity, min_capacity
12 integer, allocatable :: array(:)
13 end type
14 type :: coo_graph
15 type(dynamic_array) :: edges(2)
16 integer, private :: ne
17 end type coo_graph
18 contains
19 subroutine coo_dump_edges(g, edges)
20 class(coo_graph), intent(in) :: g
21 integer, intent(out) :: edges(:,:)
22 end subroutine coo_dump_edges
23 end module coo_graphs
24 ! { dg-final { scan-tree-dump-times "__builtin_free" 6 "original" } }