1 {-# LANGUAGE UndecidableInstances #-}
3 module ShouldFail
where
5 -- The constraint in the context of an instance declaration
6 -- is ambiguous, but we have UndecidableInstances on, so
7 -- it could conceivably be ok (we'd need OverlappingInstances
8 -- too in this case). So we allow it.
9 -- See Note [The ambiguity check for type signatures] in TcMType
12 instance Bar a
=> Bar
Bool