--- /dev/null
+{-# LANGUAGE TypeFamilies, ConstraintKinds #-}
+{-# OPTIONS_GHC -fwarn-missing-signatures #-} -- Report f's inferred type
+
+module T8889 where
+
+import GHC.Exts
+
+class C f where
+ type C_fmap f a :: Constraint
+ foo :: C_fmap f a => (a -> b) -> f a -> f b
+
+f x = foo x
--- /dev/null
+
+T8889.hs:12:1: Warning:
+ Top-level binding with no type signature:
+ f :: forall (f :: * -> *) a b.
+ (C_fmap f a, C f) =>
+ (a -> b) -> f a -> f b
test('ClosedFam2', extra_clean(['ClosedFam2.o-boot', 'ClosedFam2.hi-boot']),
multimod_compile, ['ClosedFam2', '-v0'])
test('T8651', normal, compile, [''])
+test('T8889', normal, compile, [''])