blob: 5c9b3ca18181ef1c2eb28e82afbbc65144f027f7 [file] [log] [blame]
! { dg-do compile }
subroutine s(t) ! { dg-error "Dummy argument" }
type t ! { dg-error "cannot be a derived" }
end type ! { dg-error "Expecting END SUBROUTINE" }
end