blob: 94ab11cc39ee1f0b3421b0177239026794e91bf8 [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: 10 continue
! 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)
PRINT *, g
10 END DO
END SUBROUTINE sub00