Czy mogę wyeliminować użycie UndecidableInstances w tej instancji Show dla Free Monad?

Właśnie próbowałem owinąć głowę wokół wolnych monad; jako pomoc w nauce udało mi się napisaćShow przykład dla następującychFree rodzaj:

{-# LANGUAGE FlexibleContexts, UndecidableInstances #-}

-- Free monad datatype
data Free f a = Return a | Roll (f (Free f a))

instance Functor f => Monad (Free f) where
    return = Return
    Return a >>= f = f a
    Roll ffa >>= f = Roll $ fmap (>>= f) ffa

-- Show instance for Free; requires FlexibleContexts and
-- UndecidableInstances
instance (Show (f (Free f a)), Show a) => Show (Free f a) where
    show (Return x) = "Return (" ++ show x ++ ")"
    show (Roll ffx) = "Roll (" ++ show ffx ++ ")"


-- Identity functor with Show instance
newtype Identity a = Id a deriving (Eq, Ord)

instance Show a => Show (Identity a) where
    show (Id x) = "Id (" ++ show x ++ ")"

instance Functor (Identity) where
    fmap f (Id x)= Id (f x)


-- Example computation in the Free monad
example1 :: Free Identity String
example1 = do x <- return "Hello"
              y <- return "World"
              return (x ++ " " ++ y)

Sposób użyciaUndecidableInstances trochę mnie niepokoi; Czy można się bez niego obejść? Wszystko, co daje Googleten wpis na blogu autorstwa Edwarda Kmetta, która z przyjemnością ma w zasadzie to samoShow definicja klasy jak ja.

questionAnswers(1)

yourAnswerToTheQuestion