{----------------------------------------------------------------------------- * extension: parameterised on token type * by Malcolm Wallace A LIBRARY OF MONADIC PARSER COMBINATORS 29th July 1996 Graham Hutton Erik Meijer University of Nottingham University of Utrecht This Haskell 1.3 script defines a library of parser combinators, and is taken from sections 1-6 of our article "Monadic Parser Combinators". Some changes to the library have been made in the move from Gofer to Haskell: * Do notation is used in place of monad comprehension notation; * The parser datatype is defined using "newtype", to avoid the overhead of tagging and untagging parsers with the P constructor. -----------------------------------------------------------------------------} module ParseLib (Parser(..), item, first, papply, (+++), sat, tok, many, many1, sepby, sepby1, chainl, chainl1, chainr, chainr1, ops, bracket, -- char, digit, lower, upper, -- letter, alphanum, string, ident, nat, int, spaces, comment, junk, -- skip, token, natural, integer, symbol, identifier ) where import Data.Char import Control.Monad infixr 5 +++ --- The parser monad --------------------------------------------------------- newtype Parser t a = P ([t] -> [(a,[t])]) instance Functor (Parser t) where -- map :: (a -> b) -> (Parser t a -> Parser t b) fmap f (P p) = P (\inp -> [(f v, out) | (v,out) <- p inp]) instance Monad (Parser t) where -- return :: a -> Parser t a return v = P (\inp -> [(v,inp)]) -- >>= :: Parser t a -> (a -> Parser t b) -> Parser t b (P p) >>= f = P (\inp -> concat [papply (f v) out | (v,out) <- p inp]) -- fail :: String -> Parser t a fail _ = P (\inp -> []) instance MonadPlus (Parser t) where -- mzero :: Parser t a mzero = P (\inp -> []) -- mplus :: Parser t a -> Parser t a -> Parser t a (P p) `mplus` (P q) = P (\inp -> (p inp ++ q inp)) --- Other primitive parser combinators --------------------------------------- item :: Parser t t item = P (\inp -> case inp of [] -> [] (x:xs) -> [(x,xs)]) force :: Parser t a -> Parser t a force (P p) = P (\inp -> let x = p inp in (fst (head x), snd (head x)) : tail x) first :: Parser t a -> Parser t a first (P p) = P (\inp -> case p inp of [] -> [] (x:xs) -> [x]) papply :: Parser t a -> [t] -> [(a,[t])] papply (P p) inp = p inp --- Derived combinators ------------------------------------------------------ (+++) :: Parser t a -> Parser t a -> Parser t a p +++ q = first (p `mplus` q) sat :: (t -> Bool) -> Parser t t sat p = do {x <- item; if p x then return x else mzero} tok :: Eq t => t -> Parser t t tok t = do {x <- item; if t==x then return t else mzero} many :: Parser t a -> Parser t [a] many p = many1 p +++ return [] --many p = force (many1 p +++ return []) many1 :: Parser t a -> Parser t [a] many1 p = do {x <- p; xs <- many p; return (x:xs)} sepby :: Parser t a -> Parser t b -> Parser t [a] p `sepby` sep = (p `sepby1` sep) +++ return [] sepby1 :: Parser t a -> Parser t b -> Parser t [a] p `sepby1` sep = do {x <- p; xs <- many (do {sep; p}); return (x:xs)} chainl :: Parser t a -> Parser t (a -> a -> a) -> a -> Parser t a chainl p op v = (p `chainl1` op) +++ return v chainl1 :: Parser t a -> Parser t (a -> a -> a) -> Parser t a p `chainl1` op = do {x <- p; rest x} where rest x = do {f <- op; y <- p; rest (f x y)} +++ return x chainr :: Parser t a -> Parser t (a -> a -> a) -> a -> Parser t a chainr p op v = (p `chainr1` op) +++ return v chainr1 :: Parser t a -> Parser t (a -> a -> a) -> Parser t a p `chainr1` op = do {x <- p; rest x} where rest x = do { f <- op ; y <- p `chainr1` op ; return (f x y)} +++ return x ops :: [(Parser t a, b)] -> Parser t b ops xs = foldr1 (+++) [do {p; return op} | (p,op) <- xs] bracket :: Parser t a -> Parser t b -> Parser t c -> Parser t b bracket open p close = do {open; x <- p; close; return x} {- --- Useful parsers ----------------------------------------------------------- char :: Char -> Parser Char char x = sat (\y -> x == y) digit :: Parser Char digit = sat isDigit lower :: Parser Char lower = sat isLower upper :: Parser Char upper = sat isUpper letter :: Parser Char letter = sat isAlpha alphanum :: Parser Char alphanum = sat isAlphanum +++ char '_' string :: String -> Parser String string "" = return "" string (x:xs) = do {char x; string xs; return (x:xs)} ident :: Parser String ident = do {x <- lower; xs <- many alphanum; return (x:xs)} nat :: Parser Int nat = do {x <- digit; return (fromEnum x - fromEnum '0')} `chainl1` return op where m `op` n = 10*m + n int :: Parser Int int = do {char '-'; n <- nat; return (-n)} +++ nat --- Lexical combinators ------------------------------------------------------ spaces :: Parser () spaces = do {many1 (sat isSpace); return ()} comment :: Parser () --comment = do {string "--"; many (sat (\x -> x /= '\n')); return ()} --comment = do -- _ <- string "--" -- _ <- many (sat (\x -> x /= '\n')) -- return () comment = do bracket (string "/*") (many item) (string "*/") return () junk :: Parser () junk = do {many (spaces +++ comment); return ()} skip :: Parser a -> Parser a skip p = do {junk; p} token :: Parser a -> Parser a token p = do {v <- p; junk; return v} --- Token parsers ------------------------------------------------------------ natural :: Parser Int natural = token nat integer :: Parser Int integer = token int symbol :: String -> Parser String symbol xs = token (string xs) identifier :: [String] -> Parser String identifier ks = token (do {x <- ident; if not (elem x ks) then return x else return MZERO}) ------------------------------------------------------------------------------ -}