Могу ли я исключить использование UndecidableInstances в этом экземпляре Show для Free Monad?

Я только что пытался обернуть голову вокруг свободных монад; в качестве учебного пособия мне удалось написатьShow экземпляр для следующегоFree тип:

{-# 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)

ИспользованиеUndecidableInstances беспокоит меня несколько; есть ли способ обойтись без него? Все, что Google даетэто сообщение в блоге Эдварда Кметтакоторый имеет в основном то же самоеShow определение класса, как я.

Ответы на вопрос(1)

Ваш ответ на вопрос