OSDN Git Service

2011-01-29 Jerry DeLisle <jvdelisle@gcc.gnu.org>
[pf3gnuchains/gcc-fork.git] / gcc / testsuite / gfortran.dg / bounds_check_strlen_1.f90
1 ! { dg-do run }
2 ! { dg-options "-fbounds-check" }
3 ! { dg-shouldfail "Character length mismatch" }
4
5 ! PR fortran/37746
6 ! Test bounds-checking for string length of dummy arguments.
7
8 SUBROUTINE test (str)
9   IMPLICIT NONE
10   CHARACTER(len=5) :: str
11 END SUBROUTINE test
12
13 PROGRAM main
14   IMPLICIT NONE
15   CALL test ('abc') ! { dg-warning "Character length of actual argument shorter" }
16 END PROGRAM main
17
18 ! { dg-output "shorter than the declared one for dummy argument 'str' \\(3/5\\)" }