14

我正在尝试创建一堆 monad 转换器,但无法为我的函数获取正确的类型签名。(我对 Haskell 还是很陌生)

该堆栈结合了多个 StateT 转换器,因为我需要跟踪多个状态(其中两个可以被元组化,但我会在一秒钟内完成)和一个用于日志记录的 WriterT。

这是我到目前为止所拥有的:

module Pass1 where
import Control.Monad.Identity
import Control.Monad.State
import Control.Monad.Writer
import Data.Maybe
import qualified Data.Map as Map
import Types

data Msg = Error String
         | Warning String

type Pass1 a = WriterT [Msg] (StateT Int (StateT [Line] (StateT [Address] Identity))) a


runPass1 addrs instrs msgs = runIdentity (runStateT (runStateT (runStateT (runWriterT msgs) 1) instrs) addrs)


--popLine :: (MonadState s m) => m (Maybe s)
--popLine :: (Monad m) => StateT [Line] m (Maybe Line)
popLine :: (MonadState s m) => m (Maybe Line)
popLine = do
        ls <- get
        case ls of
          x:xs -> do
                    put xs
                    return $ Just x
          []   -> return Nothing


incLineNum :: (Num s, MonadState s m) => m ()
incLineNum = do
               ln <- get
               put $ ln + 1

curLineNum :: (MonadState s m) => m s
curLineNum = do
               ln <- get
               return ln

evalr = do l <- popLine
           --incLineNum
           return l

我想popLine弄乱[Line]状态和xLineNum影响Int状态的功能。evalr是将传递给 的计算runPass1

每当我加载代码时,我都会遇到以下错误:

Pass1.hs:23:14:
    No instance for (MonadState [t] m)
      arising from a use of `get' at Pass1.hs:23:14-16
    Possible fix: add an instance declaration for (MonadState [t] m)
    In a stmt of a 'do' expression: ls <- get
    In the expression:
        do ls <- get
           case ls of {
             x : xs -> do ...
             [] -> return Nothing }
    In the definition of `popLine':
        popLine = do ls <- get
                     case ls of {
                       x : xs -> ...
                       [] -> return Nothing }


Pass1.hs:22:0:
    Couldn't match expected type `s' against inferred type `[Line]'
      `s' is a rigid type variable bound by                        
          the type signature for `popLine' at Pass1.hs:21:23        
    When using functional dependencies to combine                  
      MonadState [Line] m,                                         
        arising from a use of `get' at Pass1.hs:23:14-16            
      MonadState s m,                                              
        arising from the type signature for `popLine'              
                     at Pass1.hs:(22,0)-(28,31)                     
    When generalising the type(s) for `popLine'         




Pass1.hs:23:14:
    Could not deduce (MonadState [Line] m)
      from the context (MonadState s m)   
      arising from a use of `get' at Pass1.hs:23:14-16
    Possible fix:                                    
      add (MonadState [Line] m) to the context of    
        the type signature for `popLine'             
      or add an instance declaration for (MonadState [Line] m)
    In a stmt of a 'do' expression: ls <- get
    In the expression:
        do ls <- get
           case ls of {
             x : xs -> do ...
             [] -> return Nothing }
    In the definition of `popLine':
        popLine = do ls <- get
                     case ls of {
                       x : xs -> ...
                       [] -> return Nothing }

没有一个签名似乎是正确的,但 popLine 是第一个函数,所以它是唯一一个立即导致错误的函数。

我尝试在类型签名中添加它所建议的内容(例如:popLine :: (MonadState [Line] m) => ...但随后出现如下错误:

Pass1.hs:21:0:
    Non type-variable argument in the constraint: MonadState [Line] m
    (Use -XFlexibleContexts to permit this)                          
    In the type signature for `popLine':                             
      popLine :: (MonadState [Line] m) => m (Maybe Line)

每当我尝试做一些不是类型变量的事情时,我似乎总是会收到这条消息。它似乎喜欢(MonadState s m)在其他东西上 ok 和 error,但是当我用 a[a]而不是sit 尝试它时,错误类似于上面。(最初 [Line] 和 Int 在一个状态下进行元组处理,但我收到了这个错误,所以我想我会尝试将它们置于不同的状态)。

GHC 6.10.4,库本图

那么,谁能告诉我发生了什么并给出解释/向我展示正确的类型签名,或者有没有人知道关于这些东西的一个很好的参考(到目前为止唯一有帮助的是“Monad Transformers Step by Step” ,但只使用一个辅助状态函数和一个StateT)?

提前谢谢了。

编辑
这是包含 JFT 和 Edward 建议的编译代码:

{-# LANGUAGE GeneralizedNewtypeDeriving #-} -- needed for: deriving (Functor,Monad)
{-# LANGUAGE MultiParamTypeClasses #-}      -- needed for: MonadState instance
{-# LANGUAGE FlexibleContexts #-}           -- needed for: (MonadState PassState m) => ...

module Pass1 where
import Control.Monad.State
import Control.Monad.Writer
import Data.Maybe
import Types

type Lines     = [Line]
type Addresses = [Address]
type LineNum   = Int
type Messages  = [Msg]
data Msg = Error String
         | Warning String

data PassState = PassState { passLineNum :: LineNum
                           , passLines :: Lines
                           , passAddresses :: Addresses
                           }

newtype Pass1 a = Pass1 { unPass1 :: WriterT Messages (State PassState) a
                        }
                        deriving (Functor,Monad)

instance MonadState PassState Pass1 where
        get   = Pass1 . lift $ get
        put s = Pass1 . lift $ put s



runPass1 :: PassState -> Pass1 a -> ((a, Messages), PassState)
runPass1 state = flip runState state .
                 runWriterT          .
                 unPass1


curLineNum :: (MonadState PassState m) => m LineNum
curLineNum = do
               state <- get
               return $ passLineNum state


nextLine :: (MonadState PassState m) => m (Maybe Line)
nextLine = do
             state <- get
             let c = passLineNum state
             let l = passLines state
             case l of
               x:xs -> do
                         put state { passLines = xs, passLineNum = (c+1) }
                         return $ Just x
               _ -> return Nothing



evalr :: Pass1 (Maybe Line,LineNum)
evalr = do
          l <- nextLine
          c <- curLineNum
          --tell $ Warning "hello"
          return (l,c)

我结合incLineNumpopLine进入nextLine我仍然需要让 Writer monad 部分工作,但我想我知道从这里去哪里。多谢你们。

4

2 回答 2

40

您的代码段存在许多问题。我修复了你的片段,添加了关于什么被破坏的解释,并添加了一些风格建议,如果你在乎的话。

module Pass1_JFT where
import Control.Monad.Identity
import Control.Monad.State
import Control.Monad.Writer
import Data.Maybe
import qualified Data.Map as Map

{- 用简单的定义替换你的导入类型 -}

--import Types
type Line       = String
type Address    = String
type LineNumber = Int

{- 不是你的问题的一部分,而是我的 2 美分...假设你想更改你的状态的集合,如果你不使用类型别名,你将不得不在你使用它的任何地方寻找。如果需要,只需更改这些定义 -}

type Lines     = [Line]
type Addresses = [Address]
type Messages  = [Msg]


data Msg = Error String
         | Warning String

{- StateT Int 中的 Int 是什么?命名它更易于阅读、推理和更改。声明式 FTW 让我们改用 LineNumber -}

--type Pass1 a = WriterT [Msg] (StateT Int (StateT [Line] (StateT [Address] Identity))) a

{- 让我们使用“真实”类型,以便可以派生实例。由于 Pass1 不是 monad 传输,即未定义为 Pass1 ma,因此没有必要将 StateT 用于最深的 StateT 即 StateT [Address] Identity,所以我们只使用 State [Address] -}

newtype Pass1 a = Pass1 {
    unPass1 :: WriterT Messages (StateT LineNumber (StateT Lines (State Addresses))) a
                        }
                        deriving (Functor,Monad)

--runIdentity (runStateT (runStateT (runStateT (runWriterT msgs) 1) instrs) addrs)

{- 让我们将堆栈从最外层(声明中的最左端)剥离到最内层,即原始声明中的 Identity。请注意,runWriterT 不采用起始状态... runStateT(和 runState)的第一个参数不是初始状态,而是单子...所以让我们翻转!-}

runPass1' :: Addresses -> Lines -> Messages -> Pass1 a ->  ((((a, Messages), LineNumber), Lines), Addresses)
runPass1' addrs instrs msgs = flip runState addrs   .
                              flip runStateT instrs .
                              flip runStateT 1      .
                              runWriterT            . -- then get process the WriterT (the second outermost)
                              unPass1                 -- let's peel the outside Pass1

{- 现在最后一个函数没有做你想做的事,因为你想提供一个初始日志来附加到 WriterT。由于它是一个 monad 转换器,我们将在这里做一些技巧 -}

-- I keep the runStateT convention for the order of the arguments: Monad then state
runWriterT' :: (Monad m,Monoid w) => WriterT w m a -> w -> m (a,w)
runWriterT' writer log = do
    (result,log') <- runWriterT writer
    -- let's use the monoid generic append in case you change container...
    return (result,log `mappend` log')

runPass1 :: Addresses -> Lines -> Messages -> Pass1 a ->  ((((a, Messages), LineNumber), Lines), Addresses)
runPass1 addrs instrs msgs = flip runState addrs   .
                             flip runStateT instrs .
                             flip runStateT 1      .
                             flip runWriterT' msgs . -- then get process the WriterT (the second outermost)
                             unPass1                 -- let's peel the outside Pass1

{- 你打算直接从 Pass1 堆栈调用 popLine 吗?如果是这样,您需要“教” Pass1 成为“MonadState Lines”为此,让我们派生 Pass1(这就是我们用 newtype 声明它的原因!)-}

instance MonadState Lines Pass1 where
    -- we need to dig inside the stack and "lift" the proper get
    get   = Pass1 . lift . lift $ get
    put s = Pass1 . lift . lift $ put s

{- 最好保持通用,但我们现在可以这样写:popLine :: Pass1 (Maybe Line) -}

popLine :: (MonadState Lines m) => m (Maybe Line)
popLine = do
        ls <- get
        case ls of
          x:xs -> do
                    put xs
                    return $ Just x
          []   -> return Nothing

{- 好的,现在我得到了 Int => LineNumber.... 我们可以制作 Pass1 和 MonadState LineNumber 的实例,但 LineNumber 不应该被弄乱,所以我会直接对 incLine 进行编码,并在需要时提供 MonadReader 实例以供咨询

check ":t incLineNum and :t curLineNum"

-}

incLineNum = Pass1 . lift $ modify (+1)

curLineNum = Pass1 $ lift get

evalr = do l <- popLine
           incLineNum
           return l

这是一个冗长的响应,但正如你所看到的,monad 和 monad stack 一开始是具有挑战性的。我修复了代码,但我鼓励您玩并检查各种函数的类型,以了解正在发生的事情并与您的原始代码进行比较。Haskell 的类型推断意味着通常类型注释是多余的(除非消除歧义)。一般来说,我们赋予函数的类型不像 infer 那样通用,所以最好不要键入注释。类型注释绝对是一种很好的调试技术;)

干杯

PS Real World Haskell 关于 Monad Transformer 的章节非常棒: http ://book.realworldhaskell.org/read/monad-transformers.html

于 2010-01-18T02:52:24.623 回答
12

通常,您会发现使用具有更大复合结构的 StateT 来处理您需要的所有状态位的代码会更加清晰。一个很好的理由是,当你想出一个你忘记的状态时,你总是可以将结构增加一个字段,并且你可以使用记录糖来写出单个字段更新或转向 fclabels 或数据访问器之类的东西包来操纵状态。

data PassState = PassState { passLine :: Int, passLines :: [Line] }

popLine :: MonadState PassState m => m (Maybe Line).   
popLine = do
   state <- get
   case passLines state of
      x:xs -> do 
         put state { passLines = xs }
         return (Just x)
      _ -> return Nothing
于 2010-01-18T11:48:29.200 回答