2 ! Tests the fix for PRs 19358, 19477, 21211 and 21622.
4 ! Note that this tests only the valid cases with explicit interfaces.
6 ! Contributed by Paul Thomas <pault@gcc.gnu.org>
11 REAL, DIMENSION(i
:) :: x
18 REAL, DIMENSION(i
:) :: x
25 real, dimension(3) :: y
= 0
30 REAL, DIMENSION(i
:) :: x
37 if (any(y
.ne
.(/21.0, 99.0, 42.0/))) call abort ()
40 REAL, DIMENSION(i
:) :: x
46 ! { dg-final { cleanup-modules "global" } }