aboutsummaryrefslogtreecommitdiffstats
path: root/gcc-4.9/gcc/testsuite/gfortran.dg/do_check_4.f90
blob: 65bc92c7e1a8144dc375e9ee0682808f3412e07d (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
! { dg-do run }
! { dg-options "-fcheck=do" }
! { dg-shouldfail "DO check" }
!
! PR fortran/34656
! Run-time check for modifing loop variables
!
PROGRAM test
  IMPLICIT NONE
  INTEGER :: i
  DO i=1,100
    CALL do_something()
  ENDDO
CONTAINS
 SUBROUTINE do_something()
 IMPLICIT NONE
   DO i=1,10
   ENDDO
 END SUBROUTINE do_something
END PROGRAM test
! { dg-output "Fortran runtime error: Loop variable has been modified" }