OSDN Git Service

* config/i386/i386.md (UNSPEC_VSIBADDR): New.
[pf3gnuchains/gcc-fork.git] / gcc / testsuite / gfortran.dg / whole_file_3.f90
1 ! { dg-do compile }
2 ! { dg-options "-fwhole-file" }
3 ! Tests the fix for PR26227 in which the interface mismatches
4 ! below were not detected.
5 !
6 ! Contributed by Andrew Pinski <pinskia@gcc.gnu.org>
7 !
8       SUBROUTINE PHLOAD (READER,*)
9       IMPLICIT NONE
10       EXTERNAL         READER
11       CALL READER (*1)
12  1    RETURN 1
13       END SUBROUTINE
14
15       program test
16       EXTERNAL R
17       call PHLOAD (R, 1) ! { dg-warning "Missing alternate return spec" }
18       CALL PHLOAD (R, 2) ! { dg-warning "Missing alternate return spec" }
19       CALL PHLOAD (R, *999) ! This one is OK
20  999  continue
21       END program test