blob: 0125467a9f2a9c6b443160a6f682af020d71ba24 [file] [log] [blame]
! RUN: %S/test_any.sh %s %t %f18
! negative test -- invalid labels, out of range
! EXEC: ${F18} -funparse-with-symbols %s 2>&1 | ${FileCheck} %s
! CHECK: end do
SUBROUTINE sub00(a,b,n,m)
INTEGER n,m
REAL a(n,m), b(n,m)
i = n-1
DO 10 j = 1,m
g = a(i,j) - b(i,j)
10 PRINT *, g
END SUBROUTINE sub00