view gcc/testsuite/gfortran.dg/do_check_4.f90 @ 152:2b5abeee2509

update gcc11
author anatofuz
date Mon, 25 May 2020 07:50:57 +0900
parents 04ced10e8804
children
line wrap: on
line source

! { 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" }