2 ! { dg-options "-fcheck=bounds" }
4 ! PR 42804: ICE with -fcheck=bounds and type bound procedure call on array element
6 ! Contributed by Ian Harvey <ian_harvey@bigpond.com>
11 PROCEDURE(a_proc
),pointer :: Proc
14 SUBROUTINE a_proc(this
, stat
)
15 CLASS(A
), INTENT(INOUT
) :: this
16 INTEGER, INTENT(OUT
) :: stat
27 TYPE(A
), ALLOCATABLE
:: arr(:)
31 CALL arr(i
)%Proc(ierr
)