blob: ebb728cf0810cdcd1c0114d4d81f2c1a0f3321a8 [file] [log] [blame]
! RUN: %flang_fc1 -fsyntax-only -pedantic %s 2>&1 | FileCheck %s
module m
type t
contains
!CHECK: portability: type-bound procedure statement should have '::' if it has '=>'
procedure p => sub
end type
contains
subroutine sub(x)
class(t), intent(in) :: x
end subroutine
end module