键入以包名称和版本为前缀的名称

时间:2015-01-19 21:29:52

标签: haskell happstack heist

我对Haskell很新,我正在尝试跟随Happstack Crash Course。我已经完成了一些示例,但是当我尝试the happstack-heist example时,我遇到了一个奇怪的编译错误。我正在编译的文件如下所示:

module Main where

import Control.Applicative    ((<$>))
import Control.Monad          (msum)
import qualified Data.Text    as T
import Happstack.Server       ( dir, nullConf, nullDir, simpleHTTP
                              , seeOther, toResponse
                              )
import Happstack.Server.Heist (heistServe, initHeistCompiled)
import Heist                  (Splices, (##), getParamNode, noSplices)
import Heist.Compiled         (Splice, yieldRuntimeText)
import qualified Text.XmlHtml as X

-- | factorial splice
factSplice :: (Monad m) => Splice m
factSplice = do
  intStr <- T.unpack . X.nodeText <$> getParamNode
  let res = yieldRuntimeText $ do
        case reads intStr of
          [(n,[])] ->
            return (T.pack $ show $ product [1..(n :: Integer)])
          _ ->
            return (T.pack $ "Unable to parse " ++
                    intStr ++ " as an Integer.")
  return $ res

main :: IO ()
main = do
  heistState <- do
    r <- initHeistCompiled (T.pack "fact" ## factSplice) noSplices "."
    case r of
      (Left e) -> error $ unlines e
      (Right heistState) -> return $ heistState
  simpleHTTP nullConf $ msum
    [ dir "heist" $ heistServe heistState
    , nullDir >>
      seeOther "/heist/factorial" (toResponse "/heist/factorial")
    ]

错误是:

test.hs:37:36:
    Couldn't match expected type `happstack-server-7.3.9:Happstack.Server.Internal.Types.Response'
                with actual type `Happstack.Server.Internal.Types.Response'
    In the return type of a call of `toResponse'
    In the second argument of `seeOther', namely
      `(toResponse "/heist/factorial")'
    In the second argument of `(>>)', namely
      `seeOther "/heist/factorial" (toResponse "/heist/factorial")'

好像有些东西想要以包名和版本号为前缀的类型,我不明白。 happstack-server和happstack-heist都安装了cabal install

1 个答案:

答案 0 :(得分:3)

欢迎来到cabal地狱!发生的情况是,当您为此示例happstack-serverhappstack-heist安装了两个软件包时,其中一个软件包引入了系统上已安装的另一个版本。当您尝试编译示例时,编译器无法确定要使用哪一个。对此的解决方案是sandboxes。只需cd到此示例所在的目录,运行cabal sandbox init,然后cabal install --dependencies-only。这将获取具有.cabal文件的项目的所有依赖项,并将它们安装在本地.cabal-sandbox/目录中。当您运行cabal buildcabal install时,将从此本地文件夹中提取相关性,并且任何可执行文件都将安装在.cabal-sandbox/bin中。