URL
https://opencores.org/ocsvn/openrisc/openrisc/trunk
Subversion Repositories openrisc
[/] [openrisc/] [trunk/] [gnu-dev/] [or1k-gcc/] [gcc/] [testsuite/] [gfortran.dg/] [whole_file_18.f90] - Rev 694
Compare with Previous | Blame | View Log
! { dg-do compile }
! { dg-options "-fwhole-file -Wno-unused-dummy-argument" }
!
! PR fortran/34260
!
PROGRAM MAIN
REAL A
CALL SUB(A) ! { dg-error "requires an explicit interface" }
END PROGRAM
SUBROUTINE SUB(A,I)
REAL :: A
INTEGER, OPTIONAL :: I
END SUBROUTINE