Posso eliminar o uso de UndecidableInstances nesta instância Show para um Free Monad?

Acabei de tentar envolver minha mente em torno de mônadas livres; como uma ajuda de aprendizagem, eu consegui escrever umShow instância para o seguinteFree tipo:

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

O uso deUndecidableInstances me incomoda um pouco; Existe uma maneira de fazer sem isso? Tudo o que o Google produz éeste post de Edward Kmett, que confortavelmente tem basicamente o mesmoShow definição de classe como eu faço.

questionAnswers(1)

yourAnswerToTheQuestion