aboutsummaryrefslogtreecommitdiff
path: root/src/Language/Mili/Parser.hs
diff options
context:
space:
mode:
authorMarvin Borner2024-11-13 16:18:01 +0100
committerMarvin Borner2024-11-13 21:53:37 +0100
commitf60b209eae598160f6cf160415e08ae72658cd32 (patch)
tree3f8db41ec8b0e378b2aa3e2d1c8f827b981cbb32 /src/Language/Mili/Parser.hs
Initial structure
Diffstat (limited to 'src/Language/Mili/Parser.hs')
-rw-r--r--src/Language/Mili/Parser.hs127
1 files changed, 127 insertions, 0 deletions
diff --git a/src/Language/Mili/Parser.hs b/src/Language/Mili/Parser.hs
new file mode 100644
index 0000000..bd61254
--- /dev/null
+++ b/src/Language/Mili/Parser.hs
@@ -0,0 +1,127 @@
+{-# LANGUAGE OverloadedStrings #-}
+
+module Language.Mili.Parser
+ ( parseProgram
+ ) where
+
+import Control.Monad ( void )
+import Control.Monad.State
+import Data.HashMap.Strict ( HashMap )
+import qualified Data.HashMap.Strict as M
+import Data.Mili ( Term(..) )
+import Data.Text ( Text )
+import qualified Data.Text as T
+import Data.Void
+import Prelude hiding ( abs )
+import Text.Megaparsec hiding ( State )
+import Text.Megaparsec.Char
+import qualified Text.Megaparsec.Char.Lexer as L
+
+type Parser = ParsecT Void Text (State ParserState)
+data ParserState = PS
+ { _map :: HashMap Text Term
+ , _depth :: Int
+ }
+
+-- | single line comment
+lineComment :: Parser ()
+lineComment = L.skipLineComment "--"
+
+-- | multiline comment
+blockComment :: Parser ()
+blockComment = L.skipBlockComment "{-" "-}"
+
+parens :: Parser a -> Parser a
+parens = between (symbol "(") (symbol ")")
+
+-- | space consumer including comments
+spaceConsumer :: String -> Parser ()
+spaceConsumer s = L.space (void $ oneOf s) lineComment blockComment
+
+-- | multiple spaces with comments
+spaces :: Parser ()
+spaces = spaceConsumer (" \t" :: String)
+
+-- | multiple spaces and newlines with comments
+anySpaces :: Parser ()
+anySpaces = spaceConsumer (" \t\r\n" :: String)
+
+-- | arbitrary symbol consumer
+symbol :: Text -> Parser Text
+symbol = string
+
+-- | symbol consumer with arbitrary spaces behind
+startSymbol :: Text -> Parser Text
+startSymbol t = symbol t <* anySpaces
+
+-- | abstraction, entering increases the abstraction depth
+-- TODO: There's a bug in here with open terms backtracking to increment lol
+abs :: Parser Term
+abs = between (startSymbol "[") (symbol "]") (Abs <$> (inc *> block <* dec))
+ where
+ inc = modify $ \r@(PS { _depth = d }) -> r { _depth = d + 1 }
+ dec = modify $ \r@(PS { _depth = d }) -> r { _depth = d - 1 }
+
+-- | de Bruijn index, parsed to de Bruijn level
+idx :: Parser Term
+idx = do
+ n <- L.decimal
+ PS { _depth = d } <- get
+ case d - n - 1 of
+ i | i < 0 -> fail "open term"
+ | otherwise -> pure $ Lvl i
+
+-- | single identifier, directly parsed to corresponding term
+def :: Parser Term
+def = do
+ name <- identifier
+ PS { _map = names } <- get
+ case M.lookup name names of
+ Just t -> pure t
+ Nothing -> fail $ T.unpack name <> " is not in scope"
+
+-- | single lambda term, potentially a left application fold of many
+term :: Parser Term
+term = try chain <|> once
+ where
+ once = abs <|> idx <|> def <|> parens block
+ chain = foldl1 App <$> sepEndBy1 (try once) (char ' ')
+
+-- | single identifier, a-z
+identifier :: Parser Text
+identifier = T.pack <$> some lowerChar
+
+-- | single definition, <identifier> = <term>
+definition :: Parser ()
+definition = do
+ name <- identifier
+ _ <- spaces
+ _ <- startSymbol "="
+ _ <- spaces
+ body <- term
+ modify $ \r@(PS { _map = m }) -> r { _map = M.insert name body m }
+
+-- | many definitions, seperated by newline or semicolon
+definitions :: Parser [()]
+definitions = endBy (try definition) (oneOf (";\n" :: String) <* anySpaces)
+
+-- | single "let..in" block: many definitions before a single term
+block :: Parser Term
+block = do
+ (PS { _map = m }) <- get -- backup
+ b <- definitions *> term
+ _ <- anySpaces
+ modify $ \r -> r { _map = m } -- restore
+ pure b
+
+-- TODO: add preprocessor commands?
+program :: Parser Term
+program = block
+
+parseProgram :: Text -> Either String Term
+parseProgram s = prettify $ evalState
+ (runParserT (anySpaces *> program <* anySpaces <* eof) "" s)
+ PS { _map = M.empty, _depth = 0 }
+ where
+ prettify (Right t ) = Right t
+ prettify (Left err) = Left $ errorBundlePretty err