2017-02-20 Paul Thomas <pault@gcc.gnu.org>
[official-gcc.git] / gcc / testsuite / gfortran.dg / pr28971.f90
blob23045fce4539388dffd80e7e7a436b0537ed130c
1 ! { dg-do compile }
2 ! This caused an ICE for gfortrans of July 2006 vintage. It was a regression
3 ! that "fixed" itself. The cause and the fix are mysteries. This test is intended
4 ! to signal any further regression, should it occur.
6 ! Contributed by Oskar Enoksson <enok@lysator.liu.se>
8 SUBROUTINE BUG(A,B)
9 IMPLICIT NONE
11 INTEGER :: A
12 INTEGER :: B(2)
14 INTEGER, PARAMETER :: C(2) = (/ 1,2 /)
16 WHERE (C(:).EQ.A)
17 B = -1
18 END WHERE
19 END SUBROUTINE BUG