hnix/src/Nix/Parser.hs

324 lines
11 KiB
Haskell
Raw Normal View History

2018-04-10 17:34:21 +02:00
{-# LANGUAGE CPP #-}
2018-04-07 21:02:50 +02:00
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-name-shadowing #-}
module Nix.Parser (
parseNixFile,
parseNixFileLoc,
parseNixText,
parseNixTextLoc,
Result(..)
) where
import Control.Applicative hiding (many, some)
2018-04-07 21:02:50 +02:00
import Control.Monad
import Control.Monad.IO.Class
import Data.Char (isAlpha, isDigit, isSpace)
2018-04-07 21:02:50 +02:00
import Data.Functor
import qualified Data.List.NonEmpty as NE
2018-04-07 21:02:50 +02:00
import qualified Data.HashMap.Strict.InsOrd as M
import Data.Text hiding (map)
2018-04-07 21:02:50 +02:00
import Nix.Expr hiding (($>))
import Nix.Parser.Library
import Nix.Parser.Operators
import Nix.StringOperations
import Text.Megaparsec.Expr
2018-04-07 21:02:50 +02:00
--------------------------------------------------------------------------------
nixExpr :: Parser NExpr
nixExpr = stripAnnotation <$> nixExprLoc
-- | The lexer for this parser is defined in 'Nix.Parser.Library'.
nixExprLoc :: Parser NExprLoc
nixExprLoc = whiteSpace *> (nixToplevelForm <|> exprParser)
exprParser :: Parser NExprLoc
2018-04-10 17:35:18 +02:00
exprParser = makeExprParser nixTerm $ map (map snd) (nixOperators nixSelector)
2018-04-07 21:02:50 +02:00
antiStart :: Parser Text
antiStart = try (symbol "${") <?> show ("${" :: String)
2018-04-07 21:02:50 +02:00
nixAntiquoted :: Parser a -> Parser (Antiquoted a NExprLoc)
nixAntiquoted p =
Antiquoted <$> (antiStart *> nixExprLoc <* symbol "}")
<|> Plain <$> p
<?> "anti-quotation"
2018-04-07 21:02:50 +02:00
selDot :: Parser ()
selDot = try (symbol "." *> notFollowedBy nixPath) <?> "."
nixSelect :: Parser NExprLoc -> Parser NExprLoc
nixSelect term = build
<$> term
<*> optional ((,) <$> (selDot *> nixSelector)
<*> optional (reserved "or" *> nixTerm))
where
build :: NExprLoc
-> Maybe (Ann SrcSpan (NAttrPath NExprLoc), Maybe NExprLoc)
-> NExprLoc
build t Nothing = t
build t (Just (s,o)) = nSelectLoc t s o
2018-04-07 21:02:50 +02:00
nixSelector :: Parser (Ann SrcSpan (NAttrPath NExprLoc))
nixSelector = annotateLocation $ keyName `sepBy1` selDot
2018-04-10 17:34:21 +02:00
-- #define DEBUG_PARSER 1
#if DEBUG_PARSER
2018-04-07 21:02:50 +02:00
-- | A self-contained unit.
nixTerm :: Parser NExprLoc
2018-04-10 09:40:11 +02:00
nixTerm = nixSelect $ choice
2018-04-10 18:03:18 +02:00
[ dbg "Parens" nixParens
, dbg "Set" nixSet
, dbg "List" nixList
, dbg "SPath" nixSPath
2018-04-10 18:03:18 +02:00
, dbg "StringExpr" nixStringExpr
, dbg "Path" nixPath
, dbg "Uri" nixUri
, dbg "Float" nixFloat
, dbg "Int" nixInt
, dbg "Bool" nixBool
, dbg "Null" nixNull
, dbg "Sym" nixSym ]
nixToplevelForm :: Parser NExprLoc
nixToplevelForm = choice
2018-04-10 18:03:18 +02:00
[ dbg "Let" nixLet
, dbg "If" nixIf
, dbg "Assert" nixAssert
2018-04-10 18:03:18 +02:00
, dbg "With" nixWith
, dbg "Lambda" nixLambda ]
2018-04-10 17:34:21 +02:00
#else
nixTerm :: Parser NExprLoc
nixTerm = nixSelect $ choice
2018-04-10 18:03:18 +02:00
[ nixParens
, nixSet
, nixList
, nixSPath
2018-04-10 18:03:18 +02:00
, nixStringExpr
, nixPath
, nixUri
, nixFloat
, nixInt
, nixBool
, nixNull
, nixSym ]
2018-04-07 21:02:50 +02:00
nixToplevelForm :: Parser NExprLoc
nixToplevelForm = choice
2018-04-10 18:03:18 +02:00
[ nixLet
, nixIf
, nixAssert
2018-04-10 18:03:18 +02:00
, nixWith
, nixLambda ]
2018-04-10 17:34:21 +02:00
#endif
2018-04-07 21:02:50 +02:00
nixSym :: Parser NExprLoc
nixSym = annotateLocation1 $ mkSymF <$> identifier
nixInt :: Parser NExprLoc
nixInt = annotateLocation1 (mkIntF <$> integer <?> "integer")
2018-04-07 21:02:50 +02:00
nixFloat :: Parser NExprLoc
nixFloat = annotateLocation1 (try (mkFloatF . realToFrac <$> float) <?> "float")
2018-04-07 21:02:50 +02:00
nixBool :: Parser NExprLoc
nixBool = annotateLocation1 (try (bool "true" True <|>
bool "false" False) <?> "bool") where
bool str b = mkBoolF b <$ lexeme (string str <* notFollowedBy pathChar)
2018-04-07 21:02:50 +02:00
nixNull :: Parser NExprLoc
nixNull = annotateLocation1
(mkNullF <$ try (lexeme (string "null" <* notFollowedBy pathChar))
<?> "null")
2018-04-07 21:02:50 +02:00
nixParens :: Parser NExprLoc
nixParens = parens nixExprLoc <?> "parens"
nixList :: Parser NExprLoc
nixList = annotateLocation1 (brackets (NList <$> many nixTerm) <?> "list")
2018-04-07 21:02:50 +02:00
pathChar :: Parser Char
pathChar = satisfy $ \x ->
isAlpha x || isDigit x || x == '.' || x == '_' || x == '-' || x == '+'
2018-04-07 21:02:50 +02:00
slash :: Parser Char
slash = try (char '/' <* notFollowedBy (satisfy (\x -> x == '/' || x == '*' || isSpace x)))
2018-04-07 21:02:50 +02:00
<?> "slash"
-- | A path surrounded by angle brackets, indicating that it should be
-- looked up in the NIX_PATH environment variable at evaluation.
nixSPath :: Parser NExprLoc
nixSPath = annotateLocation1
(mkPathF True <$> try (char '<' *> many (pathChar <|> slash) <* symbol ">")
<?> "spath")
2018-04-07 21:02:50 +02:00
pathStr :: Parser FilePath
2018-04-10 09:40:11 +02:00
pathStr = lexeme $ liftM2 (++) (many pathChar)
(Prelude.concat <$> some (liftM2 (:) slash (some pathChar)))
2018-04-07 21:02:50 +02:00
nixPath :: Parser NExprLoc
2018-04-10 09:40:11 +02:00
nixPath = annotateLocation1 (try (mkPathF False <$> pathStr) <?> "path")
2018-04-07 21:02:50 +02:00
nixLet :: Parser NExprLoc
nixLet = annotateLocation1 (reserved "let"
2018-04-07 21:02:50 +02:00
*> (letBody <|> letBinders)
<?> "let block")
2018-04-07 21:02:50 +02:00
where
letBinders = NLet
<$> nixBinders
<*> (reserved "in" *> nixExprLoc)
2018-04-07 21:02:50 +02:00
-- Let expressions `let {..., body = ...}' are just desugared
-- into `(rec {..., body = ...}).body'.
letBody = (\x pos -> NSelect x [StaticKey "body" (Just pos)] Nothing)
<$> aset <*> getPosition
2018-04-07 21:02:50 +02:00
aset = annotateLocation1 $ NRecSet <$> braces nixBinders
nixIf :: Parser NExprLoc
nixIf = annotateLocation1 (NIf
2018-04-07 21:02:50 +02:00
<$> (reserved "if" *> nixExprLoc)
<*> (reserved "then" *> nixExprLoc)
<*> (reserved "else" *> nixExprLoc)
<?> "if")
2018-04-07 21:02:50 +02:00
nixAssert :: Parser NExprLoc
nixAssert = annotateLocation1 (NAssert
2018-04-07 21:02:50 +02:00
<$> (reserved "assert" *> nixExprLoc)
<*> (semi *> nixExprLoc)
<?> "assert")
2018-04-07 21:02:50 +02:00
nixWith :: Parser NExprLoc
nixWith = annotateLocation1 (NWith
2018-04-07 21:02:50 +02:00
<$> (reserved "with" *> nixExprLoc)
<*> (semi *> nixExprLoc)
<?> "with")
2018-04-07 21:02:50 +02:00
nixLambda :: Parser NExprLoc
2018-04-10 09:40:11 +02:00
nixLambda = nAbs <$> annotateLocation (try argExpr) <*> nixExprLoc
2018-04-07 21:02:50 +02:00
nixStringExpr :: Parser NExprLoc
nixStringExpr = nStr <$> annotateLocation nixString
nixUri :: Parser NExprLoc
2018-04-10 17:34:21 +02:00
nixUri = annotateLocation1 $ lexeme $ try $ do
start <- letterChar
protocol <- many $ satisfy $ \x ->
isAlpha x || isDigit x || x `elem` ("+-." :: String)
_ <- string ":"
address <- some $ satisfy $ \x ->
isAlpha x || isDigit x || x `elem` ("%/?:@&=+$,-_.!~*'" :: String)
return $ mkUriF $ pack $ start : protocol ++ ':' : address
2018-04-07 21:02:50 +02:00
nixString :: Parser (NString NExprLoc)
nixString = lexeme (doubleQuoted <|> indented <?> "string")
2018-04-07 21:02:50 +02:00
where
doubleQuoted :: Parser (NString NExprLoc)
doubleQuoted = DoubleQuoted . removePlainEmpty . mergePlain
<$> (doubleQ *> many (stringChar doubleQ (void $ char '\\') doubleEscape)
<* doubleQ)
2018-04-07 21:02:50 +02:00
<?> "double quoted string"
doubleQ = void (char '"')
2018-04-07 21:02:50 +02:00
doubleEscape = Plain . singleton <$> (char '\\' *> escapeCode)
indented :: Parser (NString NExprLoc)
indented = stripIndent
<$> (indentedQ *> many (stringChar indentedQ indentedQ indentedEscape)
<* indentedQ)
2018-04-07 21:02:50 +02:00
<?> "indented string"
indentedQ = void (try (string "''") <?> "\"''\"")
2018-04-07 21:02:50 +02:00
indentedEscape = fmap Plain
$ try (indentedQ *> char '\\') *> fmap singleton escapeCode
<|> try (indentedQ *> ("''" <$ char '\'' <|> "$" <$ char '$'))
stringChar end escStart esc = esc
<|> Antiquoted <$> (antiStart *> nixExprLoc <* char '}')
-- ^ don't skip trailing space
<|> Plain . singleton <$> char '$'
<|> Plain . pack <$> some plainChar
where
plainChar =
notFollowedBy (end <|> void (char '$') <|> escStart) *> anyChar
2018-04-07 21:02:50 +02:00
escapeCode = choice [ c <$ char e | (c,e) <- escapeCodes ] <|> anyChar
-- | Gets all of the arguments for a function.
argExpr :: Parser (Params NExprLoc)
argExpr = choice [atLeft, onlyname, atRight] <* symbol ":" where
2018-04-07 21:02:50 +02:00
-- An argument not in curly braces. There's some potential ambiguity
-- in the case of, for example `x:y`. Is it a lambda function `x: y`, or
-- a URI `x:y`? Nix syntax says it's the latter. So we need to fail if
-- there's a valid URI parse here.
onlyname = choice [nixUri >> unexpected (Label ('v' NE.:| "alid uri")),
2018-04-07 21:02:50 +02:00
Param <$> identifier]
-- Parameters named by an identifier on the left (`args @ {x, y}`)
atLeft = try $ do
name <- identifier <* symbol "@"
2018-04-07 21:02:50 +02:00
(variadic, params) <- params
return $ ParamSet params variadic (Just name)
-- Parameters named by an identifier on the right, or none (`{x, y} @ args`)
atRight = do
(variadic, params) <- params
name <- optional $ symbol "@" *> identifier
2018-04-07 21:02:50 +02:00
return $ ParamSet params variadic name
-- Return the parameters set.
params = do
(args, dotdots) <- braces getParams
return (dotdots, M.fromList args)
-- Collects the parameters within curly braces. Returns the parameters and
-- a boolean indicating if the parameters are variadic.
getParams :: Parser ([(Text, Maybe NExprLoc)], Bool)
getParams = go [] where
-- Attempt to parse `...`. If this succeeds, stop and return True.
-- Otherwise, attempt to parse an argument, optionally with a
-- default. If this fails, then return what has been accumulated
-- so far.
go acc = ((acc, True) <$ symbol "...") <|> getMore acc
2018-04-07 21:02:50 +02:00
getMore acc =
-- Could be nothing, in which just return what we have so far.
option (acc, False) $ do
-- Get an argument name and an optional default.
pair <- liftA2 (,) identifier (optional $ question *> nixExprLoc)
2018-04-07 21:02:50 +02:00
-- Either return this, or attempt to get a comma and restart.
option (acc ++ [pair], False) $ comma >> go (acc ++ [pair])
2018-04-07 21:02:50 +02:00
nixBinders :: Parser [Binding NExprLoc]
nixBinders = (inherit <|> namedVar) `endBy` semi where
2018-04-07 21:02:50 +02:00
inherit = Inherit <$> (reserved "inherit" *> optional scope)
<*> many keyName
<?> "inherited binding"
namedVar = NamedVar <$> (annotated <$> nixSelector)
<*> (equals *> nixExprLoc)
2018-04-07 21:02:50 +02:00
<?> "variable binding"
scope = parens nixExprLoc <?> "inherit scope"
keyName :: Parser (NKeyName NExprLoc)
2018-04-10 18:44:52 +02:00
keyName = dynamicKey <|> staticKey where
2018-04-07 21:02:50 +02:00
staticKey = do
beg <- getPosition
2018-04-07 21:02:50 +02:00
StaticKey <$> identifier <*> pure (Just beg)
dynamicKey = DynamicKey <$> nixAntiquoted nixString
nixSet :: Parser NExprLoc
nixSet = annotateLocation1 ((isRec <*> braces nixBinders) <?> "set") where
2018-04-07 21:02:50 +02:00
isRec = (try (reserved "rec" $> NRecSet) <?> "recursive set")
<|> pure NSet
parseNixFile :: MonadIO m => FilePath -> m (Result NExpr)
parseNixFile = parseFromFileEx $ nixExpr <* eof
parseNixFileLoc :: MonadIO m => FilePath -> m (Result NExprLoc)
parseNixFileLoc = parseFromFileEx $ nixExprLoc <* eof
parseNixText :: Text -> Result NExpr
parseNixText = parseFromText $ nixExpr <* eof
2018-04-07 21:02:50 +02:00
parseNixTextLoc :: Text -> Result NExprLoc
parseNixTextLoc = parseFromText $ nixExprLoc <* eof