X-Git-Url: http://git.cielonegro.org/gitweb.cgi?a=blobdiff_plain;f=Network%2FHTTP%2FLucu%2FParser%2FHttp.hs;h=72d8ca1721ae7908a94cd1b2445eff1aaa16e1c8;hb=ece223c;hp=c1b30fc208c1d6bbbb787911f642c52de7ef3288;hpb=3c7a58ab749a55a30466a033b170536bcdf18b98;p=Lucu.git diff --git a/Network/HTTP/Lucu/Parser/Http.hs b/Network/HTTP/Lucu/Parser/Http.hs index c1b30fc..72d8ca1 100644 --- a/Network/HTTP/Lucu/Parser/Http.hs +++ b/Network/HTTP/Lucu/Parser/Http.hs @@ -1,66 +1,165 @@ +{-# LANGUAGE + OverloadedStrings + , UnicodeSyntax + #-} +-- |This is an auxiliary parser utilities for parsing things related +-- on HTTP protocol. +-- +-- In general you don't have to use this module directly. module Network.HTTP.Lucu.Parser.Http - ( isCtl -- Char -> Bool - , isSeparator -- Char -> Bool - , isChar -- Char -> Bool - , token -- Parser String - , lws -- Parser String - , text -- Parser Char - , separator -- Parser Char - , quotedStr -- Parser String + ( isCtl + , isText + , isSeparator + , isChar + , isToken + , isSPHT + + , listOf + + , crlf + , sp + , lws + + , token + , separators + , quotedStr + , qvalue ) where - -import qualified Data.ByteString.Lazy.Char8 as B -import Data.ByteString.Lazy.Char8 (ByteString) -import Data.List -import Network.HTTP.Lucu.Parser - -isCtl :: Char -> Bool +import Control.Applicative +import Control.Monad +import Data.Ascii (Ascii) +import qualified Data.Ascii as A +import Data.Attoparsec.Char8 as P hiding (scan) +import qualified Data.Attoparsec.FastSet as FS +import qualified Data.ByteString.Char8 as BS +import Network.HTTP.Lucu.Parser +import Prelude.Unicode + +-- |@'isCtl' c@ returns 'False' iff @0x20 <= c < 0x7F@. +isCtl ∷ Char → Bool +{-# INLINE isCtl #-} isCtl c - | c < '\x1f' = True - | c == '\x7f' = True + | c ≤ '\x1f' = True + | c > '\x7f' = True | otherwise = False +-- |@'isText'@ is equivalent to @'not' '.' 'isCtl'@ +isText ∷ Char → Bool +{-# INLINE isText #-} +isText = (¬) ∘ isCtl -isSeparator :: Char -> Bool -isSeparator c = elem c "()<>@,;:\\\"/[]?={} \t" - - -isChar :: Char -> Bool -isChar c - | c <= '\x7f' = True - | otherwise = False - - -token :: Parser String -token = many1 $ satisfy (\ c -> not (isCtl c || isSeparator c)) - - -lws :: Parser String -lws = do s <- option "" crlf - xs <- many1 (sp <|> ht) - return (s ++ xs) - - -text :: Parser Char -text = satisfy (\ c -> not (isCtl c)) - - -separator :: Parser Char -separator = satisfy isSeparator - - -quotedStr :: Parser String -quotedStr = do char '"' - xs <- many (qdtext <|> quotedPair) - char '"' - return $ foldr (++) "" (["\""] ++ xs ++ ["\""]) +-- |@'isSeparator' c@ returns 'True' iff c is one of the HTTP +-- separators. +isSeparator ∷ Char → Bool +{-# INLINE isSeparator #-} +isSeparator = flip FS.memberChar set + where + {-# NOINLINE set #-} + set = FS.charClass "()<>@,;:\\\"/[]?={}\x20\x09" + +-- |@'isChar' c@ returns 'True' iff @c <= 0x7f@. +isChar ∷ Char → Bool +{-# INLINE isChar #-} +isChar = (≤ '\x7F') + +-- |@'isToken' c@ is equivalent to @not ('isCtl' c '||' 'isSeparator' +-- c)@ +isToken ∷ Char → Bool +{-# INLINE isToken #-} +isToken c = (¬) (isCtl c ∨ isSeparator c) + +-- |@'listOf' p@ is similar to @'sepBy' p ('char' \',\')@ but it +-- allows any occurrences of 'lws' before and after each tokens. +listOf ∷ Parser a → Parser [a] +{-# INLINEABLE listOf #-} +listOf p + = do skipMany lws + p `sepBy` do skipMany lws + void $ char ',' + skipMany lws + + "listOf" + +-- |'token' is almost the same as @'takeWhile1' 'isToken'@ +token ∷ Parser Ascii +{-# INLINE token #-} +token = (A.unsafeFromByteString <$> takeWhile1 isToken) + + "token" + +-- |The CRLF: 0x0D 0x0A. +crlf ∷ Parser () +{-# INLINE crlf #-} +crlf = (string "\x0D\x0A" *> return ()) + + "crlf" + +-- |The SP: 0x20. +sp ∷ Parser () +{-# INLINE sp #-} +sp = char '\x20' *> return () + +-- |HTTP LWS: crlf? (sp | ht)+ +lws ∷ Parser () +{-# INLINEABLE lws #-} +lws = (option () crlf *> void (takeWhile1 isSPHT)) + + "lws" + +-- |Returns 'True' for SP and HT. +isSPHT ∷ Char → Bool +{-# INLINE isSPHT #-} +isSPHT '\x20' = True +isSPHT '\x09' = True +isSPHT _ = False + +-- |@'separators'@ is almost the same as @'takeWhile1' 'isSeparator'@. +separators ∷ Parser Ascii +{-# INLINE separators #-} +separators = (A.unsafeFromByteString <$> takeWhile1 isSeparator) + + "separators" + +-- |'quotedStr' accepts a string surrounded by double quotation +-- marks. Quotes can be escaped by backslashes. +quotedStr ∷ Parser Ascii +{-# INLINEABLE quotedStr #-} +quotedStr = do void $ char '"' + xs ← P.many (qdtext <|> quotedPair) + void $ char '"' + return $ A.unsafeFromByteString $ BS.pack xs + + "quotedStr" where - qdtext = char '"' >> fail "" - <|> - do c <- text - return [c] - - quotedPair = do q <- char '\\' - c <- satisfy isChar - return [q, c] + qdtext ∷ Parser Char + {-# INLINE qdtext #-} + qdtext = satisfy (\c → c ≢ '"' ∧ (¬) (isCtl c)) + + "qdtext" + + quotedPair ∷ Parser Char + {-# INLINE quotedPair #-} + quotedPair = (char '\\' *> satisfy isChar) + + "quotedPair" + +-- |'qvalue' accepts a so-called qvalue. +qvalue ∷ Parser Double +{-# INLINEABLE qvalue #-} +qvalue = ( do x ← char '0' + xs ← option "" $ + do y ← char '.' + ys ← atMost 3 digit + return (y:ys) + return $ read (x:xs) + <|> + do x ← char '1' + xs ← option "" $ + do y ← char '.' + ys ← atMost 3 (char '0') + return (y:ys) + return $ read (x:xs) + ) + + "qvalue"