blob: 5b1a3b6cd4de97f1251975fb1067aeee7def7763 [file] [log] [blame]
! { dg-do compile }
! { dg-options "-std=f2008ts" }
!
! Support Fortran 2015's IMPLICIT NONE with spec list
! (currently implemented as vendor extension)
implicit none (type) ! { dg-error "GNU Extension: IMPORT NONE with spec list at \\(1\\)" }
end