3 ! This tests the improved version of the patch for PR16861. Testing
4 ! after committing the first version, revealed that this test did
5 ! not work but was not regtested for, either.
7 ! Contributed by Paul Thomas <pault@gcc.gnu.org>
17 SUBROUTINE sub1 (x
, y
)
23 SUBROUTINE sub2 (u
, v
)
35 SUBROUTINE sub3 (s
, t
)
54 IF (ALL (j
.ne
.(/3,2,1/))) CALL abort ()
55 END PROGRAM use_foobar