开发者

Warning: Pattern match(es) are overlapped when matching on strings

I am trying to make a simple url route in Haskell and can't get around the warning:

Warning: Pattern match(es) are overlapped
             In a case alternative: "/" -> ...
Ok, modules loaded: Main.

the snippet:

{-# LANGUAGE OverloadedStrings #-}
import Network.Wai
import Network.Wai.Handler.Warp (run)
import Network.Wai.Middleware.Debug (debug)
import Network.HTTP.Types (statusOK, status404)
import qualified Data.ByteString as B
import qualified Data.ByteString.Lazy as L
import Data.ByteString.Char8 (unpack)
import Data.ByteString.Lazy.Char8 (pack)
import qualified Data.Text.Lazy as T
import Control.Monad.IO.Class (liftIO, MonadIO)

application req = do
  case unpack $ rawPathInfo req of
    "/items" -> itemsJSON 
    "/" -> indexPage
    _ ->  return $ responseLBS status404 [("Content-Type", "text/plain")]
          "Not found"

indexPage = do
  page <- liftIO $ L.readFile "templates/index.html"
  return $ responseLBS statusOK [("Content-Type", "text/html开发者_运维问答; charset=utf-8")] page

itemsJSON  =
  return $ responseLBS statusOK 
    [("Content-Type", "application/json; charset=utf-8")] "hi"

main =  do
  run 3000 $ debug $ application

UPD: replaced snippet with complete program, and

$ ghc -V
The Glorious Glasgow Haskell Compilation System, version 6.12.1


This is a bug, and is fixed in newer versions of GHC.

0

上一篇:

下一篇:

精彩评论

暂无评论...
验证码 换一张
取 消

最新问答

问答排行榜