Kann ich die Verwendung von UndecidableInstances in dieser Show-Instanz für eine kostenlose Monade ausschließen?

Ich habe gerade versucht, meinen Kopf um freie Monaden zu wickeln; als lernhilfe habe ich es geschafft ein zu schreibenShow Instanz für die folgendenFree Art:

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

Die Verwendung vonUndecidableInstances stört mich etwas; gibt es eine möglichkeit darauf zu verzichten? Alles, was Google einbringt, istDieser Blog-Beitrag von Edward Kmett, was im Grunde bequem das gleiche hatShow Klassendefinition wie ich.

Antworten auf die Frage(1)

Ihre Antwort auf die Frage