PR inline-asm/84742
[official-gcc.git] / gcc / testsuite / gfortran.dg / class_array_11.f03
blob6e1bdb07ebdee5e06cafb5cf70dd78a8929330b9
1 ! { dg-do compile }
3 ! PR fortran/46356
4 ! This program was leading to an ICE related to class arrays
6 ! Original testcase by Ian Harvey <ian_harvey@bigpond.com>
7 ! Reduced by Janus Weil <Janus@gcc.gnu.org>
9   IMPLICIT NONE
11   TYPE :: ParentVector
12     INTEGER :: a
13   END TYPE ParentVector  
15 CONTAINS       
17   SUBROUTINE vector_operation(pvec)     
18     CLASS(ParentVector), INTENT(INOUT) :: pvec(:)
19     print *,pvec(1)%a
20   END SUBROUTINE
22 END