blob: 6e793faed89617b286c2748502516eca6078d964 [file] [log] [blame]
! RUN: %python %S/test_errors.py %s %flang_fc1
subroutine s1
implicit none
!ERROR: IMPLICIT statement after IMPLICIT NONE or IMPLICIT NONE(TYPE) statement
implicit integer(a-z)
end subroutine
subroutine s2
implicit none(type)
!ERROR: IMPLICIT statement after IMPLICIT NONE or IMPLICIT NONE(TYPE) statement
implicit integer(a-z)
end subroutine