1! { dg-do compile }
2! { dg-options "-frepack-arrays " }
3!
4! Original class_array_11.f03 but with -frepack-arrays a new
5! ICE was produced reported in
6! PR fortran/69659
7!
8! Original testcase by Ian Harvey <ian_harvey@bigpond.com>
9! Reduced by Janus Weil <Janus@gcc.gnu.org>
10
11  IMPLICIT NONE
12
13  TYPE :: ParentVector
14    INTEGER :: a
15  END TYPE ParentVector
16
17CONTAINS
18
19  SUBROUTINE vector_operation(pvec)
20    CLASS(ParentVector), INTENT(INOUT) :: pvec(:)
21    print *,pvec(1)%a
22  END SUBROUTINE
23
24END
25
26