1 {-# LANGUAGE DatatypeContexts, ExistentialQuantification #-}
3 -- Tests the "stupid theta" in pattern-matching
4 -- when there's an existential as well
6 module ShouldCompile
where
8 data (Show a
) => Obs a
= forall b
. LiftObs a b
10 f
:: Obs a
-> String -- Needs a (Show a) context
11 f
(LiftObs _ _
) = "yes"