是否有可能强制回溯所有选项?

时间:2016-05-30 12:24:01

标签: parsing haskell text-parsing parsec megaparsec

我需要解析函数声明

的语法
foo x = 1 
Func "foo" (Ident "x") = 1

foo (x = 1) = 1 
Func "foo" (Label "x" 1) = 1

foo x = y = 1 
Func "foo" (Ident "x") = (Label "y" 1)

我写过这个解析器

module SimpleParser where
import Text.Parsec.String (Parser)
import Text.Parsec.Language (emptyDef)
import Text.Parsec
import qualified Text.Parsec.Token as Tok
import Text.Parsec.Char
import Prelude

lexer :: Tok.TokenParser ()
lexer = Tok.makeTokenParser style
  where
    style = emptyDef {
              Tok.identLetter    = alphaNum
             }

parens :: Parser a -> Parser a
parens = Tok.parens lexer

commaSep :: Parser a -> Parser [a]
commaSep = Tok.commaSep1 lexer

commaSep1 :: Parser a -> Parser [a]
commaSep1 = Tok.commaSep1 lexer


identifier :: Parser String
identifier = Tok.identifier lexer

reservedOp :: String -> Parser ()
reservedOp = Tok.reservedOp lexer

data Expr = IntLit Int | Ident String | Label String Expr | Func String Expr Expr | ExprList [Expr] deriving (Eq, Ord, Show)


integer :: Parser Integer
integer = Tok.integer lexer

litInt :: Parser Expr
litInt = do
  n <- integer
  return $ IntLit (fromInteger n)

ident :: Parser Expr
ident = Ident <$> identifier

paramLabelItem = litInt <|> paramLabel

paramLabel :: Parser Expr
paramLabel = do
  lbl <- try (identifier <* reservedOp "=")
  body <- paramLabelItem
  return $ Label lbl body

paramItem :: Parser Expr
paramItem = parens paramRecord <|> litInt <|> try paramLabel <|> ident

paramRecord :: Parser Expr
paramRecord = ExprList <$> commaSep1 paramItem

func :: Parser Expr
func = do
  name <- identifier
  params <- paramRecord
  reservedOp "="
  body <- paramRecord
  return $ (Func name params body)


parseExpr :: String -> Either ParseError Expr
parseExpr s = parse func "" s

我可以解析foo (x) = 1,但我无法解析foo x = 1

parseExpr "foo x = 1"
Left (line 1, column 10):
unexpected end of input
expecting digit, "," or "="

据我所知,它尝试解析像Func "foo" (Label "x" 1)这样的代码并失败。但是在失败之后为什么它不能像Func "foo" (Ident "x") = 1

那样尝试解析它

有什么办法吗?

此外,我还尝试交换identparamLabel

paramItem = parens paramRecord <|> litInt <|> try paramLabel <|> ident
paramItem = parens paramRecord <|> litInt <|> try ident <|> paramLabel

在这种情况下,我可以解析foo x = 1,但我无法解析foo (x = 1) = 2

parseExpr "foo (x = 1) = 2"
Left (line 1, column 8):
unexpected "="
expecting "," or ")"

1 个答案:

答案 0 :(得分:1)

以下是我如何理解Parsec回溯如何工作(并且不起作用):

在:

(try a <|> try b <|> c)

如果a失败,则会尝试b,如果b随后失败,则会尝试c

然而,在:

(try a <|> try b <|> c) >> d

如果a成功但d失败,Parsec会返回并尝试b。一旦a成功,Parsec会将整个选择视为已解析,然后转移到d。它永远不会回去尝试bc

由于同样的原因,这不起作用:

(try (try a <|> try b <|> c)) >> d

一旦ab成功,整个选择就会成功,因此外部try会成功。解析然后转到d

解决方案是将d分发到选项中:

try (a >> d) <|> try (b >> d) <|> (c >> d)

现在,如果a成功但d失败,则会尝试b >> d