URL
https://opencores.org/ocsvn/openrisc/openrisc/trunk
Subversion Repositories openrisc
[/] [openrisc/] [trunk/] [gnu-stable/] [gcc-4.5.1/] [gcc/] [testsuite/] [gfortran.dg/] [bounds_check_strlen_1.f90] - Rev 816
Go to most recent revision | Compare with Previous | Blame | View Log
! { dg-do run }
! { dg-options "-fbounds-check" }
! { dg-shouldfail "Character length mismatch" }
! PR fortran/37746
! Test bounds-checking for string length of dummy arguments.
SUBROUTINE test (str)
IMPLICIT NONE
CHARACTER(len=5) :: str
END SUBROUTINE test
PROGRAM main
IMPLICIT NONE
CALL test ('abc') ! String is too short.
END PROGRAM main
! { dg-output "shorter than the declared one for dummy argument 'str' \\(3/5\\)" }
Go to most recent revision | Compare with Previous | Blame | View Log