私は無料モナド状態モナドを埋め込むできるようにしようとしています。1つが一致しないと「重複するインスタンス」エラーが表示されるのはなぜですか?
{-# language FlexibleInstances, MultiParamTypeClasses #-}
module Main where
import Control.Monad.Free
import Control.Monad.State
import Data.Bifunctor
data Toy state next =
Output String next
| LiftState (state -> (next, state))
| Done
instance Functor (Toy s) where
fmap f (Output str next) = Output str $ f next
fmap f (LiftState stateF) = LiftState (first f . stateF)
fmap f Done = Done
instance MonadState s (Free (Toy s)) where
state = overState
overState :: (s -> (a, s)) -> Free (Toy s) a
overState = liftF . LiftState
output :: Show a => a -> Free (Toy s)()
output x = liftF $ Output (show x)()
done :: Free (Toy s) r
done = liftF Done
program :: Free (Toy Int)()
program = do
start <- get
output start
modify ((+10) :: (Int -> Int))
end <- get
output end
done
interpret :: (Show r) => Free (Toy s) r -> s -> IO()
interpret (Free (LiftState stateF)) s = let (next, newS) = stateF s
in interpret next newS
interpret (Free (Output str next)) s = print str >> interpret next s
interpret (Free Done) s = return()
interpret (Pure x) s = print x
main :: IO()
main = interpret program (5 :: Int)
私はエラーを取得する:ここで私の簡単な試みだ
• Overlapping instances for MonadState Int (Free (Toy Int))
arising from a use of ‘get’
Matching instances:
instance [safe] (Functor m, MonadState s m) =>
MonadState s (Free m)
-- Defined in ‘Control.Monad.Free’
instance MonadState s (Free (Toy s))
-- Defined at app/Main.hs:18:10
• In a stmt of a 'do' block: start <- get
In the expression:
do { start <- get;
output start;
modify ((+ 10) :: Int -> Int);
end <- get;
.... }
In an equation for ‘program’:
program
= do { start <- get;
output start;
modify ((+ 10) :: Int -> Int);
.... }
私の知る限り収集できるように。このインスタンスを適用しようとしている:
(Functor m, MonadState s m) => MonadState s (Free m)
を free package hereから。しかし、この場合にはFree (Toy s)
にマッチしなければならない、それはそれが適用されることを考えて、なぜ私は理解していない必要に応じて何MonadState s (Toy s)
はありません。私は私のインスタンス定義を削除した場合
私が手:
他のインスタンスは実際には適用されないというのが私の考えをサポートしてい• No instance for (MonadState Int (Toy Int))
arising from a use of ‘modify’
。指定したインスタンスを使用してこれをコンパイルするにはどうすればよいですか?なぜこれが起こっているのか説明できますか? FlexibleInstances
が使用されていますか?
ありがとうございます!インスタンスを選択する際
メタコメント:確かにこれらの質問はすべて何かの複製でなければなりませんか? –