{-# LANGUAGE ConstraintKinds, FlexibleContexts, GeneralizedNewtypeDeriving,
PatternGuards #-}
{-# OPTIONS_GHC -O0 #-}
{-# OPTIONS_GHC -fwarn-unused-imports #-}
module Idris.Parser(IdrisParser(..), ImportInfo(..), moduleName, addReplSyntax, clearParserWarnings,
decl, fixColour, loadFromIFile, loadModule, name, opChars, parseElabShellStep, parseConst, parseExpr, parseImports, parseTactic,
runparser, ParseError, parseErrorDoc) where
import Idris.AbsSyntax hiding (namespace, params)
import Idris.Core.Evaluate
import Idris.Core.TT
import Idris.Delaborate
import Idris.Docstrings hiding (Unchecked)
import Idris.DSL
import Idris.Elab.Value
import Idris.ElabDecls
import Idris.Error
import Idris.IBC
import Idris.Imports
import Idris.Options
import Idris.Output
import Idris.Parser.Data
import Idris.Parser.Expr
import Idris.Parser.Helpers
import Idris.Parser.Ops
import Idris.Termination
import Idris.Unlit
import Util.System (readSource)
import Prelude hiding (pi)
import Control.Applicative hiding (Const)
import Control.Monad
import Control.Monad.State.Strict
import Data.Char
import Data.Foldable (asum)
import Data.Function
import Data.Generics.Uniplate.Data (descendM)
import Data.List
import qualified Data.List.NonEmpty as NonEmpty
import qualified Data.List.Split as Spl
import qualified Data.Map as M
import Data.Maybe
import Data.Ord
import qualified Data.Set as S
import qualified Data.Text as T
import qualified System.Directory as Dir (doesFileExist, getModificationTime,
makeAbsolute)
import System.FilePath
import Text.Megaparsec ((<?>))
import qualified Text.Megaparsec as P
import qualified Text.PrettyPrint.ANSI.Leijen as PP
moduleName :: Parsing m => m Name
moduleName :: forall (m :: * -> *). Parsing m => m Name
moduleName = [Text] -> [Text] -> Name
mkName [] ([Text] -> Name) -> ([String] -> [Text]) -> [String] -> Name
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (String -> Text) -> [String] -> [Text]
forall a b. (a -> b) -> [a] -> [b]
map String -> Text
T.pack ([String] -> Name) -> m [String] -> m Name
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> m [String]
forall (m :: * -> *). Parsing m => m [String]
moduleNamePieces where
mkName :: [T.Text] -> [T.Text] -> Name
mkName :: [Text] -> [Text] -> Name
mkName [Text]
ts [Text
x] = if [Text] -> Bool
forall a. [a] -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null [Text]
ts then Text -> Name
UN Text
x else Name -> [Text] -> Name
NS (Text -> Name
UN Text
x) [Text]
ts
mkName [Text]
ts (Text
x:[Text]
xs) = [Text] -> [Text] -> Name
mkName (Text
x Text -> [Text] -> [Text]
forall a. a -> [a] -> [a]
: [Text]
ts) [Text]
xs
moduleNamePieces :: Parsing m => m [String]
moduleNamePieces :: forall (m :: * -> *). Parsing m => m [String]
moduleNamePieces = String -> String -> [String]
forall a. Eq a => [a] -> [a] -> [[a]]
Spl.splitOn String
"." (String -> [String]) -> m String -> m [String]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> m String
forall (m :: * -> *). Parsing m => m String
identifier
moduleHeader :: IdrisParser (Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
= IdrisParser
(Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
-> IdrisParser
(Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (do Maybe (Docstring (), [(Name, Docstring ())])
docs <- StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (), [(Name, Docstring ())])
-> StateT
IState
(WriterT FC (Parsec Void String))
(Maybe (Docstring (), [(Name, Docstring ())]))
forall (f :: * -> *) a. Alternative f => f a -> f (Maybe a)
optional StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (), [(Name, Docstring ())])
docComment
Maybe (Docstring (), [(Name, Docstring ())])
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall {t :: * -> *} {m :: * -> *} {a} {a}.
(Foldable t, MonadFail m) =>
Maybe (a, t a) -> m ()
noArgs Maybe (Docstring (), [(Name, Docstring ())])
docs
String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"module"
([String]
modName, FC
ifc) <- StateT IState (WriterT FC (Parsec Void String)) [String]
-> StateT IState (WriterT FC (Parsec Void String)) ([String], FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) [String]
forall (m :: * -> *). Parsing m => m [String]
moduleNamePieces
Char
-> StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *) a. Alternative m => a -> m a -> m a
P.option Char
';' (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
';')
(Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
-> IdrisParser
(Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (((Docstring (), [(Name, Docstring ())]) -> Docstring ())
-> Maybe (Docstring (), [(Name, Docstring ())])
-> Maybe (Docstring ())
forall a b. (a -> b) -> Maybe a -> Maybe b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap (Docstring (), [(Name, Docstring ())]) -> Docstring ()
forall a b. (a, b) -> a
fst Maybe (Docstring (), [(Name, Docstring ())])
docs,
[String]
modName,
[(FC
ifc, [Text] -> Maybe String -> OutputAnnotation
AnnNamespace ((String -> Text) -> [String] -> [Text]
forall a b. (a -> b) -> [a] -> [b]
map String -> Text
T.pack [String]
modName) Maybe String
forall a. Maybe a
Nothing)]))
IdrisParser
(Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
-> IdrisParser
(Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
-> IdrisParser
(Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> IdrisParser
(Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
-> IdrisParser
(Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (do Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%'; String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"unqualified"
(Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
-> IdrisParser
(Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Maybe (Docstring ())
forall a. Maybe a
Nothing, [], []))
IdrisParser
(Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
-> IdrisParser
(Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
-> IdrisParser
(Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
-> IdrisParser
(Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Maybe (Docstring ())
forall a. Maybe a
Nothing, [String
"Main"], [])
where noArgs :: Maybe (a, t a) -> m ()
noArgs (Just (a
_, t a
args)) | Bool -> Bool
not (t a -> Bool
forall a. t a -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null t a
args) = String -> m ()
forall a. String -> m a
forall (m :: * -> *) a. MonadFail m => String -> m a
fail String
"Modules do not take arguments"
noArgs Maybe (a, t a)
_ = () -> m ()
forall a. a -> m a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
data ImportInfo = ImportInfo { ImportInfo -> Bool
import_reexport :: Bool
, ImportInfo -> String
import_path :: FilePath
, ImportInfo -> Maybe (String, FC)
import_rename :: Maybe (String, FC)
, ImportInfo -> [Text]
import_namespace :: [T.Text]
, ImportInfo -> FC
import_location :: FC
, ImportInfo -> FC
import_modname_location :: FC
}
import_ :: IdrisParser ImportInfo
import_ :: IdrisParser ImportInfo
import_ = do FC
fc <- StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall (m :: * -> *) a. MonadWriter FC m => m a -> m FC
extent (StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC)
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall a b. (a -> b) -> a -> b
$ String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"import"
Bool
reexport <- Bool
-> StateT IState (WriterT FC (Parsec Void String)) Bool
-> StateT IState (WriterT FC (Parsec Void String)) Bool
forall (m :: * -> *) a. Alternative m => a -> m a -> m a
P.option Bool
False (Bool
True Bool
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) Bool
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"public")
([String]
ns, FC
idfc) <- StateT IState (WriterT FC (Parsec Void String)) [String]
-> StateT IState (WriterT FC (Parsec Void String)) ([String], FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) [String]
forall (m :: * -> *). Parsing m => m [String]
moduleNamePieces
Maybe (String, FC)
newName <- StateT IState (WriterT FC (Parsec Void String)) (String, FC)
-> StateT
IState (WriterT FC (Parsec Void String)) (Maybe (String, FC))
forall (f :: * -> *) a. Alternative f => f a -> f (Maybe a)
optional (do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"as"
StateT IState (WriterT FC (Parsec Void String)) String
-> StateT IState (WriterT FC (Parsec Void String)) (String, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) String
forall (m :: * -> *). Parsing m => m String
identifier)
Char
-> StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *) a. Alternative m => a -> m a -> m a
P.option Char
';' (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
';')
ImportInfo -> IdrisParser ImportInfo
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (ImportInfo -> IdrisParser ImportInfo)
-> ImportInfo -> IdrisParser ImportInfo
forall a b. (a -> b) -> a -> b
$ Bool
-> String -> Maybe (String, FC) -> [Text] -> FC -> FC -> ImportInfo
ImportInfo Bool
reexport ([String] -> String
toPath [String]
ns)
(((String, FC) -> (String, FC))
-> Maybe (String, FC) -> Maybe (String, FC)
forall a b. (a -> b) -> Maybe a -> Maybe b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap (\(String
n, FC
fc) -> ([String] -> String
toPath (String -> String -> [String]
forall a. Eq a => [a] -> [a] -> [[a]]
Spl.splitOn String
"." String
n), FC
fc)) Maybe (String, FC)
newName)
((String -> Text) -> [String] -> [Text]
forall a b. (a -> b) -> [a] -> [b]
map String -> Text
T.pack [String]
ns) FC
fc FC
idfc
IdrisParser ImportInfo -> String -> IdrisParser ImportInfo
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"import statement"
where toPath :: [String] -> String
toPath = (String -> String -> String) -> [String] -> String
forall a. HasCallStack => (a -> a -> a) -> [a] -> a
foldl1' String -> String -> String
(</>)
prog :: SyntaxInfo -> IdrisParser [PDecl]
prog :: SyntaxInfo -> IdrisParser [PDecl]
prog SyntaxInfo
syn = do ([PDecl]
decls, FC
fc) <- IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) ([PDecl], FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) ([PDecl], FC))
-> IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) ([PDecl], FC)
forall a b. (a -> b) -> a -> b
$ do
StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => m ()
whiteSpace
[PDecl]
decls <- [[PDecl]] -> [PDecl]
forall (t :: * -> *) a. Foldable t => t [a] -> [a]
concat ([[PDecl]] -> [PDecl])
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]]
-> IdrisParser [PDecl]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many (SyntaxInfo -> IdrisParser [PDecl]
decl SyntaxInfo
syn)
case SyntaxInfo -> Maybe Int
maxline SyntaxInfo
syn of
Maybe Int
Nothing -> do StateT IState (WriterT FC (Parsec Void String)) ()
notOpenBraces; StateT IState (WriterT FC (Parsec Void String)) ()
forall e s (m :: * -> *). MonadParsec e s m => m ()
P.eof
Maybe Int
_ -> () -> StateT IState (WriterT FC (Parsec Void String)) ()
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [PDecl]
decls
IState
ist <- StateT IState (WriterT FC (Parsec Void String)) IState
forall s (m :: * -> *). MonadState s m => m s
get
IState -> StateT IState (WriterT FC (Parsec Void String)) ()
forall s (m :: * -> *). MonadState s m => s -> m ()
put IState
ist { idris_parsedSpan = Just (FC (fc_fname fc) (0,0) (fc_end fc)),
ibc_write = IBCParsedRegion fc : ibc_write ist }
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [PDecl]
decls
decl :: SyntaxInfo -> IdrisParser [PDecl]
decl :: SyntaxInfo -> IdrisParser [PDecl]
decl SyntaxInfo
syn = IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (SyntaxInfo -> IdrisParser [PDecl]
externalDecl SyntaxInfo
syn)
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser [PDecl]
internalDecl SyntaxInfo
syn
IdrisParser [PDecl] -> String -> IdrisParser [PDecl]
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"declaration"
internalDecl :: SyntaxInfo -> IdrisParser [PDecl]
internalDecl :: SyntaxInfo -> IdrisParser [PDecl]
internalDecl SyntaxInfo
syn
= do FC
fc <- StateT IState (WriterT FC (Parsec Void String)) FC
forall (m :: * -> *). Parsing m => m FC
getFC
let continue :: Bool
continue = case SyntaxInfo -> Maybe Int
maxline SyntaxInfo
syn of
Maybe Int
Nothing -> Bool
True
Just Int
l -> if (Int, Int) -> Int
forall a b. (a, b) -> a
fst (FC -> (Int, Int)
fc_end FC
fc) Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
> Int
l
then SyntaxInfo -> Int
mut_nesting SyntaxInfo
syn Int -> Int -> Bool
forall a. Eq a => a -> a -> Bool
/= Int
0
else Bool
True
if Bool
continue then
do StateT IState (WriterT FC (Parsec Void String)) ()
notEndBlock
Bool -> IdrisParser [PDecl]
declBody Bool
continue
else IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (do StateT IState (WriterT FC (Parsec Void String)) ()
notEndBlock
Bool -> IdrisParser [PDecl]
declBody Bool
continue)
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> String -> IdrisParser [PDecl]
forall a.
String -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. MonadFail m => String -> m a
fail String
"End of readable input"
where declBody :: Bool -> IdrisParser [PDecl]
declBody :: Bool -> IdrisParser [PDecl]
declBody Bool
b =
IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (SyntaxInfo -> IdrisParser [PDecl]
implementation SyntaxInfo
syn)
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (SyntaxInfo -> IdrisParser [PDecl]
openInterface SyntaxInfo
syn)
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> Bool -> IdrisParser [PDecl]
declBody' Bool
b
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser [PDecl]
using_ SyntaxInfo
syn
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser [PDecl]
params SyntaxInfo
syn
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser [PDecl]
mutual SyntaxInfo
syn
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser [PDecl]
namespace SyntaxInfo
syn
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser [PDecl]
interface_ SyntaxInfo
syn
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do PDecl
d <- SyntaxInfo -> IdrisParser PDecl
dsl SyntaxInfo
syn; [PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [PDecl
d]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser [PDecl]
directive SyntaxInfo
syn
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser [PDecl]
provider SyntaxInfo
syn
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser [PDecl]
transform SyntaxInfo
syn
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do IdrisParser ImportInfo
import_; String -> IdrisParser [PDecl]
forall a.
String -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. MonadFail m => String -> m a
fail String
"imports must be at top of file"
IdrisParser [PDecl] -> String -> IdrisParser [PDecl]
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"declaration"
declBody' :: Bool -> IdrisParser [PDecl]
declBody' :: Bool -> IdrisParser [PDecl]
declBody' Bool
cont = do PDecl
d <- SyntaxInfo -> IdrisParser PDecl
decl' SyntaxInfo
syn
IState
i <- StateT IState (WriterT FC (Parsec Void String)) IState
forall s (m :: * -> *). MonadState s m => m s
get
let d' :: PDecl
d' = (PTerm -> PTerm) -> PDecl -> PDecl
forall a b. (a -> b) -> PDecl' a -> PDecl' b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap (SyntaxInfo -> PTerm -> PTerm
debindApp SyntaxInfo
syn (PTerm -> PTerm) -> (PTerm -> PTerm) -> PTerm -> PTerm
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (SyntaxInfo -> IState -> PTerm -> PTerm
desugar SyntaxInfo
syn IState
i)) PDecl
d
if Bool -> PDecl -> Bool
forall {t}. Bool -> PDecl' t -> Bool
continue Bool
cont PDecl
d'
then [PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [PDecl
d']
else String -> IdrisParser [PDecl]
forall a.
String -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. MonadFail m => String -> m a
fail String
"End of readable input"
continue :: Bool -> PDecl' t -> Bool
continue Bool
False (PClauses FC
_ FnOpts
_ Name
_ [PClause' t]
_) = Bool
True
continue Bool
c PDecl' t
_ = Bool
c
decl' :: SyntaxInfo -> IdrisParser PDecl
decl' :: SyntaxInfo -> IdrisParser PDecl
decl' SyntaxInfo
syn = IdrisParser PDecl
fixity
IdrisParser PDecl -> IdrisParser PDecl -> IdrisParser PDecl
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser PDecl
syntaxDecl SyntaxInfo
syn
IdrisParser PDecl -> IdrisParser PDecl -> IdrisParser PDecl
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser PDecl
fnDecl' SyntaxInfo
syn
IdrisParser PDecl -> IdrisParser PDecl -> IdrisParser PDecl
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser PDecl
data_ SyntaxInfo
syn
IdrisParser PDecl -> IdrisParser PDecl -> IdrisParser PDecl
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser PDecl
record SyntaxInfo
syn
IdrisParser PDecl -> IdrisParser PDecl -> IdrisParser PDecl
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser PDecl
runElabDecl SyntaxInfo
syn
IdrisParser PDecl -> String -> IdrisParser PDecl
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"declaration"
externalDecl :: SyntaxInfo -> IdrisParser [PDecl]
externalDecl :: SyntaxInfo -> IdrisParser [PDecl]
externalDecl SyntaxInfo
syn = do IState
i <- StateT IState (WriterT FC (Parsec Void String)) IState
forall s (m :: * -> *). MonadState s m => m s
get
StateT IState (WriterT FC (Parsec Void String)) ()
notEndBlock
([PDecl]
decls, fc :: FC
fc@(FC String
fn (Int, Int)
_ (Int, Int)
_)) <- IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) ([PDecl], FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) ([PDecl], FC))
-> IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) ([PDecl], FC)
forall a b. (a -> b) -> a -> b
$ SyntaxInfo -> [Syntax] -> IdrisParser [PDecl]
declExtensions SyntaxInfo
syn (SyntaxRules -> [Syntax]
syntaxRulesList (SyntaxRules -> [Syntax]) -> SyntaxRules -> [Syntax]
forall a b. (a -> b) -> a -> b
$ IState -> SyntaxRules
syntax_rules IState
i)
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return ([PDecl] -> IdrisParser [PDecl]) -> [PDecl] -> IdrisParser [PDecl]
forall a b. (a -> b) -> a -> b
$ (PDecl -> PDecl) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> [a] -> [b]
map ((FC -> FC) -> (FC -> FC) -> PDecl -> PDecl
mapPDeclFC (FC -> FC -> FC
fixFC FC
fc) (String -> FC -> FC -> FC
fixFCH String
fn FC
fc)) [PDecl]
decls
where
fixFC :: FC -> FC -> FC
fixFC :: FC -> FC -> FC
fixFC FC
outer FC
inner | FC
inner FC -> FC -> Bool
`fcIn` FC
outer = FC
inner
| Bool
otherwise = FC
outer
fixFCH :: String -> FC -> FC -> FC
fixFCH String
fn FC
outer FC
inner | FC
inner FC -> FC -> Bool
`fcIn` FC
outer = FC
inner
| Bool
otherwise = String -> FC
FileFC String
fn
declExtensions :: SyntaxInfo -> [Syntax] -> IdrisParser [PDecl]
declExtensions :: SyntaxInfo -> [Syntax] -> IdrisParser [PDecl]
declExtensions SyntaxInfo
syn [Syntax]
rules = SyntaxInfo
-> [Maybe (Name, SynMatch)] -> [Syntax] -> IdrisParser [PDecl]
declExtension SyntaxInfo
syn [] ((Syntax -> Bool) -> [Syntax] -> [Syntax]
forall a. (a -> Bool) -> [a] -> [a]
filter Syntax -> Bool
isDeclRule [Syntax]
rules)
IdrisParser [PDecl] -> String -> IdrisParser [PDecl]
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"user-defined declaration"
where
isDeclRule :: Syntax -> Bool
isDeclRule (DeclRule [SSymbol]
_ [PDecl]
_) = Bool
True
isDeclRule Syntax
_ = Bool
False
declExtension :: SyntaxInfo -> [Maybe (Name, SynMatch)] -> [Syntax]
-> IdrisParser [PDecl]
declExtension :: SyntaxInfo
-> [Maybe (Name, SynMatch)] -> [Syntax] -> IdrisParser [PDecl]
declExtension SyntaxInfo
syn [Maybe (Name, SynMatch)]
ns [Syntax]
rules =
[IdrisParser [PDecl]] -> IdrisParser [PDecl]
forall (f :: * -> *) (m :: * -> *) a.
(Foldable f, Alternative m) =>
f (m a) -> m a
P.choice ([IdrisParser [PDecl]] -> IdrisParser [PDecl])
-> [IdrisParser [PDecl]] -> IdrisParser [PDecl]
forall a b. (a -> b) -> a -> b
$ (([Syntax] -> IdrisParser [PDecl])
-> [[Syntax]] -> [IdrisParser [PDecl]])
-> [[Syntax]]
-> ([Syntax] -> IdrisParser [PDecl])
-> [IdrisParser [PDecl]]
forall a b c. (a -> b -> c) -> b -> a -> c
flip ([Syntax] -> IdrisParser [PDecl])
-> [[Syntax]] -> [IdrisParser [PDecl]]
forall a b. (a -> b) -> [a] -> [b]
map ((Syntax -> Syntax -> Bool) -> [Syntax] -> [[Syntax]]
forall a. (a -> a -> Bool) -> [a] -> [[a]]
groupBy ([SSymbol] -> [SSymbol] -> Bool
forall {a}. Eq a => [a] -> [a] -> Bool
ruleGroup ([SSymbol] -> [SSymbol] -> Bool)
-> (Syntax -> [SSymbol]) -> Syntax -> Syntax -> Bool
forall b c a. (b -> b -> c) -> (a -> b) -> a -> a -> c
`on` Syntax -> [SSymbol]
syntaxSymbols) [Syntax]
rules) (([Syntax] -> IdrisParser [PDecl]) -> [IdrisParser [PDecl]])
-> ([Syntax] -> IdrisParser [PDecl]) -> [IdrisParser [PDecl]]
forall a b. (a -> b) -> a -> b
$ \[Syntax]
rs ->
case [Syntax] -> Syntax
forall a. HasCallStack => [a] -> a
head [Syntax]
rs of
DeclRule (SSymbol
symb:[SSymbol]
_) [PDecl]
_ -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (IdrisParser [PDecl] -> IdrisParser [PDecl])
-> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a b. (a -> b) -> a -> b
$ do
Maybe (Name, SynMatch)
n <- SSymbol -> IdrisParser (Maybe (Name, SynMatch))
extSymbol SSymbol
symb
SyntaxInfo
-> [Maybe (Name, SynMatch)] -> [Syntax] -> IdrisParser [PDecl]
declExtension SyntaxInfo
syn (Maybe (Name, SynMatch)
n Maybe (Name, SynMatch)
-> [Maybe (Name, SynMatch)] -> [Maybe (Name, SynMatch)]
forall a. a -> [a] -> [a]
: [Maybe (Name, SynMatch)]
ns) [[SSymbol] -> [PDecl] -> Syntax
DeclRule [SSymbol]
ss [PDecl]
t | (DeclRule (SSymbol
_:[SSymbol]
ss) [PDecl]
t) <- [Syntax]
rs]
DeclRule [] [PDecl]
dec -> let r :: [PDecl]
r = (PDecl -> PDecl) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> [a] -> [b]
map ([(Name, SynMatch)] -> PDecl -> PDecl
update ((Maybe (Name, SynMatch) -> Maybe (Name, SynMatch))
-> [Maybe (Name, SynMatch)] -> [(Name, SynMatch)]
forall a b. (a -> Maybe b) -> [a] -> [b]
mapMaybe Maybe (Name, SynMatch) -> Maybe (Name, SynMatch)
forall a. a -> a
id [Maybe (Name, SynMatch)]
ns)) [PDecl]
dec in
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [PDecl]
r
where
update :: [(Name, SynMatch)] -> PDecl -> PDecl
update :: [(Name, SynMatch)] -> PDecl -> PDecl
update [(Name, SynMatch)]
ns = [(Name, SynMatch)] -> PDecl -> PDecl
updateNs [(Name, SynMatch)]
ns (PDecl -> PDecl) -> (PDecl -> PDecl) -> PDecl -> PDecl
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (PTerm -> PTerm) -> PDecl -> PDecl
forall a b. (a -> b) -> PDecl' a -> PDecl' b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap ([(Name, SynMatch)] -> PTerm -> PTerm
updateRefs [(Name, SynMatch)]
ns) (PDecl -> PDecl) -> (PDecl -> PDecl) -> PDecl -> PDecl
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (PTerm -> PTerm) -> PDecl -> PDecl
forall a b. (a -> b) -> PDecl' a -> PDecl' b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap ([(Name, SynMatch)] -> PTerm -> PTerm
updateSynMatch [(Name, SynMatch)]
ns)
updateRefs :: [(Name, SynMatch)] -> PTerm -> PTerm
updateRefs [(Name, SynMatch)]
ns = (PTerm -> PTerm) -> PTerm -> PTerm
mapPT PTerm -> PTerm
newref
where
newref :: PTerm -> PTerm
newref (PRef FC
fc [FC]
fcs Name
n) = FC -> [FC] -> Name -> PTerm
PRef FC
fc [FC]
fcs ([(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns Name
n)
newref PTerm
t = PTerm
t
updateB :: [(Name, SynMatch)] -> Name -> Name
updateB :: [(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns (NS Name
n [Text]
mods) = Name -> [Text] -> Name
NS ([(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns Name
n) [Text]
mods
updateB [(Name, SynMatch)]
ns Name
n = case Name -> [(Name, SynMatch)] -> Maybe SynMatch
forall a b. Eq a => a -> [(a, b)] -> Maybe b
lookup Name
n [(Name, SynMatch)]
ns of
Just (SynBind FC
tfc Name
t) -> Name
t
Maybe SynMatch
_ -> Name
n
updateNs :: [(Name, SynMatch)] -> PDecl -> PDecl
updateNs :: [(Name, SynMatch)] -> PDecl -> PDecl
updateNs [(Name, SynMatch)]
ns (PTy Docstring (Either Err PTerm)
doc [(Name, Docstring (Either Err PTerm))]
argdoc SyntaxInfo
s FC
fc FnOpts
o Name
n FC
fc' PTerm
t)
= Docstring (Either Err PTerm)
-> [(Name, Docstring (Either Err PTerm))]
-> SyntaxInfo
-> FC
-> FnOpts
-> Name
-> FC
-> PTerm
-> PDecl
forall t.
Docstring (Either Err t)
-> [(Name, Docstring (Either Err t))]
-> SyntaxInfo
-> FC
-> FnOpts
-> Name
-> FC
-> t
-> PDecl' t
PTy Docstring (Either Err PTerm)
doc [(Name, Docstring (Either Err PTerm))]
argdoc SyntaxInfo
s FC
fc FnOpts
o ([(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns Name
n) FC
fc' PTerm
t
updateNs [(Name, SynMatch)]
ns (PClauses FC
fc FnOpts
o Name
n [PClause' PTerm]
cs)
= FC -> FnOpts -> Name -> [PClause' PTerm] -> PDecl
forall t. FC -> FnOpts -> Name -> [PClause' t] -> PDecl' t
PClauses FC
fc FnOpts
o ([(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns Name
n) ((PClause' PTerm -> PClause' PTerm)
-> [PClause' PTerm] -> [PClause' PTerm]
forall a b. (a -> b) -> [a] -> [b]
map ([(Name, SynMatch)] -> PClause' PTerm -> PClause' PTerm
updateClause [(Name, SynMatch)]
ns) [PClause' PTerm]
cs)
updateNs [(Name, SynMatch)]
ns (PCAF FC
fc Name
n PTerm
t) = FC -> Name -> PTerm -> PDecl
forall t. FC -> Name -> t -> PDecl' t
PCAF FC
fc ([(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns Name
n) PTerm
t
updateNs [(Name, SynMatch)]
ns (PData Docstring (Either Err PTerm)
ds [(Name, Docstring (Either Err PTerm))]
cds SyntaxInfo
s FC
fc DataOpts
o PData' PTerm
dat)
= Docstring (Either Err PTerm)
-> [(Name, Docstring (Either Err PTerm))]
-> SyntaxInfo
-> FC
-> DataOpts
-> PData' PTerm
-> PDecl
forall t.
Docstring (Either Err t)
-> [(Name, Docstring (Either Err t))]
-> SyntaxInfo
-> FC
-> DataOpts
-> PData' t
-> PDecl' t
PData Docstring (Either Err PTerm)
ds [(Name, Docstring (Either Err PTerm))]
cds SyntaxInfo
s FC
fc DataOpts
o ([(Name, SynMatch)] -> PData' PTerm -> PData' PTerm
forall {t}. [(Name, SynMatch)] -> PData' t -> PData' t
updateData [(Name, SynMatch)]
ns PData' PTerm
dat)
updateNs [(Name, SynMatch)]
ns (PParams FC
fc [(Name, PTerm)]
ps [PDecl]
ds) = FC -> [(Name, PTerm)] -> [PDecl] -> PDecl
forall t. FC -> [(Name, t)] -> [PDecl' t] -> PDecl' t
PParams FC
fc [(Name, PTerm)]
ps ((PDecl -> PDecl) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> [a] -> [b]
map ([(Name, SynMatch)] -> PDecl -> PDecl
updateNs [(Name, SynMatch)]
ns) [PDecl]
ds)
updateNs [(Name, SynMatch)]
ns (PNamespace String
s FC
fc [PDecl]
ds) = String -> FC -> [PDecl] -> PDecl
forall t. String -> FC -> [PDecl' t] -> PDecl' t
PNamespace String
s FC
fc ((PDecl -> PDecl) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> [a] -> [b]
map ([(Name, SynMatch)] -> PDecl -> PDecl
updateNs [(Name, SynMatch)]
ns) [PDecl]
ds)
updateNs [(Name, SynMatch)]
ns (PRecord Docstring (Either Err PTerm)
doc SyntaxInfo
syn FC
fc DataOpts
o Name
n FC
fc' [(Name, FC, Plicity, PTerm)]
ps [(Name, Docstring (Either Err PTerm))]
pdocs [(Maybe (Name, FC), Plicity, PTerm,
Maybe (Docstring (Either Err PTerm)))]
fields Maybe (Name, FC)
cname Docstring (Either Err PTerm)
cdoc SyntaxInfo
s)
= Docstring (Either Err PTerm)
-> SyntaxInfo
-> FC
-> DataOpts
-> Name
-> FC
-> [(Name, FC, Plicity, PTerm)]
-> [(Name, Docstring (Either Err PTerm))]
-> [(Maybe (Name, FC), Plicity, PTerm,
Maybe (Docstring (Either Err PTerm)))]
-> Maybe (Name, FC)
-> Docstring (Either Err PTerm)
-> SyntaxInfo
-> PDecl
forall t.
Docstring (Either Err t)
-> SyntaxInfo
-> FC
-> DataOpts
-> Name
-> FC
-> [(Name, FC, Plicity, t)]
-> [(Name, Docstring (Either Err t))]
-> [(Maybe (Name, FC), Plicity, t,
Maybe (Docstring (Either Err t)))]
-> Maybe (Name, FC)
-> Docstring (Either Err t)
-> SyntaxInfo
-> PDecl' t
PRecord Docstring (Either Err PTerm)
doc SyntaxInfo
syn FC
fc DataOpts
o ([(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns Name
n) FC
fc' [(Name, FC, Plicity, PTerm)]
ps [(Name, Docstring (Either Err PTerm))]
pdocs
(((Maybe (Name, FC), Plicity, PTerm,
Maybe (Docstring (Either Err PTerm)))
-> (Maybe (Name, FC), Plicity, PTerm,
Maybe (Docstring (Either Err PTerm))))
-> [(Maybe (Name, FC), Plicity, PTerm,
Maybe (Docstring (Either Err PTerm)))]
-> [(Maybe (Name, FC), Plicity, PTerm,
Maybe (Docstring (Either Err PTerm)))]
forall a b. (a -> b) -> [a] -> [b]
map ([(Name, SynMatch)]
-> (Maybe (Name, FC), Plicity, PTerm,
Maybe (Docstring (Either Err PTerm)))
-> (Maybe (Name, FC), Plicity, PTerm,
Maybe (Docstring (Either Err PTerm)))
forall {b} {b} {c} {d}.
[(Name, SynMatch)]
-> (Maybe (Name, b), b, c, d) -> (Maybe (Name, b), b, c, d)
updateField [(Name, SynMatch)]
ns) [(Maybe (Name, FC), Plicity, PTerm,
Maybe (Docstring (Either Err PTerm)))]
fields)
([(Name, SynMatch)] -> Maybe (Name, FC) -> Maybe (Name, FC)
forall {b}.
[(Name, SynMatch)] -> Maybe (Name, b) -> Maybe (Name, b)
updateRecCon [(Name, SynMatch)]
ns Maybe (Name, FC)
cname)
Docstring (Either Err PTerm)
cdoc
SyntaxInfo
s
updateNs [(Name, SynMatch)]
ns (PInterface Docstring (Either Err PTerm)
docs SyntaxInfo
s FC
fc [(Name, PTerm)]
cs Name
cn FC
fc' [(Name, FC, PTerm)]
ps [(Name, Docstring (Either Err PTerm))]
pdocs [(Name, FC)]
pdets [PDecl]
ds Maybe (Name, FC)
cname Docstring (Either Err PTerm)
cdocs)
= Docstring (Either Err PTerm)
-> SyntaxInfo
-> FC
-> [(Name, PTerm)]
-> Name
-> FC
-> [(Name, FC, PTerm)]
-> [(Name, Docstring (Either Err PTerm))]
-> [(Name, FC)]
-> [PDecl]
-> Maybe (Name, FC)
-> Docstring (Either Err PTerm)
-> PDecl
forall t.
Docstring (Either Err t)
-> SyntaxInfo
-> FC
-> [(Name, t)]
-> Name
-> FC
-> [(Name, FC, t)]
-> [(Name, Docstring (Either Err t))]
-> [(Name, FC)]
-> [PDecl' t]
-> Maybe (Name, FC)
-> Docstring (Either Err t)
-> PDecl' t
PInterface Docstring (Either Err PTerm)
docs SyntaxInfo
s FC
fc [(Name, PTerm)]
cs ([(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns Name
cn) FC
fc' [(Name, FC, PTerm)]
ps [(Name, Docstring (Either Err PTerm))]
pdocs [(Name, FC)]
pdets
((PDecl -> PDecl) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> [a] -> [b]
map ([(Name, SynMatch)] -> PDecl -> PDecl
updateNs [(Name, SynMatch)]
ns) [PDecl]
ds)
([(Name, SynMatch)] -> Maybe (Name, FC) -> Maybe (Name, FC)
forall {b}.
[(Name, SynMatch)] -> Maybe (Name, b) -> Maybe (Name, b)
updateRecCon [(Name, SynMatch)]
ns Maybe (Name, FC)
cname)
Docstring (Either Err PTerm)
cdocs
updateNs [(Name, SynMatch)]
ns (PImplementation Docstring (Either Err PTerm)
docs [(Name, Docstring (Either Err PTerm))]
pdocs SyntaxInfo
s FC
fc [(Name, PTerm)]
cs [Name]
pnames Accessibility
acc FnOpts
opts Name
cn FC
fc' [PTerm]
ps [(Name, PTerm)]
pextra PTerm
ity Maybe Name
ni [PDecl]
ds)
= Docstring (Either Err PTerm)
-> [(Name, Docstring (Either Err PTerm))]
-> SyntaxInfo
-> FC
-> [(Name, PTerm)]
-> [Name]
-> Accessibility
-> FnOpts
-> Name
-> FC
-> [PTerm]
-> [(Name, PTerm)]
-> PTerm
-> Maybe Name
-> [PDecl]
-> PDecl
forall t.
Docstring (Either Err t)
-> [(Name, Docstring (Either Err t))]
-> SyntaxInfo
-> FC
-> [(Name, t)]
-> [Name]
-> Accessibility
-> FnOpts
-> Name
-> FC
-> [t]
-> [(Name, t)]
-> t
-> Maybe Name
-> [PDecl' t]
-> PDecl' t
PImplementation Docstring (Either Err PTerm)
docs [(Name, Docstring (Either Err PTerm))]
pdocs SyntaxInfo
s FC
fc [(Name, PTerm)]
cs [Name]
pnames Accessibility
acc FnOpts
opts ([(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns Name
cn) FC
fc'
[PTerm]
ps [(Name, PTerm)]
pextra PTerm
ity ((Name -> Name) -> Maybe Name -> Maybe Name
forall a b. (a -> b) -> Maybe a -> Maybe b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap ([(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns) Maybe Name
ni)
((PDecl -> PDecl) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> [a] -> [b]
map ([(Name, SynMatch)] -> PDecl -> PDecl
updateNs [(Name, SynMatch)]
ns) [PDecl]
ds)
updateNs [(Name, SynMatch)]
ns (PMutual FC
fc [PDecl]
ds) = FC -> [PDecl] -> PDecl
forall t. FC -> [PDecl' t] -> PDecl' t
PMutual FC
fc ((PDecl -> PDecl) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> [a] -> [b]
map ([(Name, SynMatch)] -> PDecl -> PDecl
updateNs [(Name, SynMatch)]
ns) [PDecl]
ds)
updateNs [(Name, SynMatch)]
ns (PProvider Docstring (Either Err PTerm)
docs SyntaxInfo
s FC
fc FC
fc' ProvideWhat' PTerm
pw Name
n)
= Docstring (Either Err PTerm)
-> SyntaxInfo -> FC -> FC -> ProvideWhat' PTerm -> Name -> PDecl
forall t.
Docstring (Either Err t)
-> SyntaxInfo -> FC -> FC -> ProvideWhat' t -> Name -> PDecl' t
PProvider Docstring (Either Err PTerm)
docs SyntaxInfo
s FC
fc FC
fc' ProvideWhat' PTerm
pw ([(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns Name
n)
updateNs [(Name, SynMatch)]
ns PDecl
d = PDecl
d
updateRecCon :: [(Name, SynMatch)] -> Maybe (Name, b) -> Maybe (Name, b)
updateRecCon [(Name, SynMatch)]
ns Maybe (Name, b)
Nothing = Maybe (Name, b)
forall a. Maybe a
Nothing
updateRecCon [(Name, SynMatch)]
ns (Just (Name
n, b
fc)) = (Name, b) -> Maybe (Name, b)
forall a. a -> Maybe a
Just ([(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns Name
n, b
fc)
updateField :: [(Name, SynMatch)]
-> (Maybe (Name, b), b, c, d) -> (Maybe (Name, b), b, c, d)
updateField [(Name, SynMatch)]
ns (Maybe (Name, b)
m, b
p, c
t, d
doc) = ([(Name, SynMatch)] -> Maybe (Name, b) -> Maybe (Name, b)
forall {b}.
[(Name, SynMatch)] -> Maybe (Name, b) -> Maybe (Name, b)
updateRecCon [(Name, SynMatch)]
ns Maybe (Name, b)
m, b
p, c
t, d
doc)
updateClause :: [(Name, SynMatch)] -> PClause' PTerm -> PClause' PTerm
updateClause [(Name, SynMatch)]
ns (PClause FC
fc Name
n PTerm
t [PTerm]
ts PTerm
t' [PDecl]
ds)
= FC
-> Name -> PTerm -> [PTerm] -> PTerm -> [PDecl] -> PClause' PTerm
forall t. FC -> Name -> t -> [t] -> t -> [PDecl' t] -> PClause' t
PClause FC
fc ([(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns Name
n) PTerm
t [PTerm]
ts PTerm
t' ((PDecl -> PDecl) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> [a] -> [b]
map ([(Name, SynMatch)] -> PDecl -> PDecl
update [(Name, SynMatch)]
ns) [PDecl]
ds)
updateClause [(Name, SynMatch)]
ns (PWith FC
fc Name
n PTerm
t [PTerm]
ts PTerm
t' Maybe (Name, FC)
m [PDecl]
ds)
= FC
-> Name
-> PTerm
-> [PTerm]
-> PTerm
-> Maybe (Name, FC)
-> [PDecl]
-> PClause' PTerm
forall t.
FC
-> Name
-> t
-> [t]
-> t
-> Maybe (Name, FC)
-> [PDecl' t]
-> PClause' t
PWith FC
fc ([(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns Name
n) PTerm
t [PTerm]
ts PTerm
t' Maybe (Name, FC)
m ((PDecl -> PDecl) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> [a] -> [b]
map ([(Name, SynMatch)] -> PDecl -> PDecl
update [(Name, SynMatch)]
ns) [PDecl]
ds)
updateClause [(Name, SynMatch)]
ns (PClauseR FC
fc [PTerm]
ts PTerm
t [PDecl]
ds)
= FC -> [PTerm] -> PTerm -> [PDecl] -> PClause' PTerm
forall t. FC -> [t] -> t -> [PDecl' t] -> PClause' t
PClauseR FC
fc [PTerm]
ts PTerm
t ((PDecl -> PDecl) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> [a] -> [b]
map ([(Name, SynMatch)] -> PDecl -> PDecl
update [(Name, SynMatch)]
ns) [PDecl]
ds)
updateClause [(Name, SynMatch)]
ns (PWithR FC
fc [PTerm]
ts PTerm
t Maybe (Name, FC)
m [PDecl]
ds)
= FC
-> [PTerm]
-> PTerm
-> Maybe (Name, FC)
-> [PDecl]
-> PClause' PTerm
forall t.
FC -> [t] -> t -> Maybe (Name, FC) -> [PDecl' t] -> PClause' t
PWithR FC
fc [PTerm]
ts PTerm
t Maybe (Name, FC)
m ((PDecl -> PDecl) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> [a] -> [b]
map ([(Name, SynMatch)] -> PDecl -> PDecl
update [(Name, SynMatch)]
ns) [PDecl]
ds)
updateData :: [(Name, SynMatch)] -> PData' t -> PData' t
updateData [(Name, SynMatch)]
ns (PDatadecl Name
n FC
fc t
t [(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], Name, FC, t, FC, [Name])]
cs)
= Name
-> FC
-> t
-> [(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], Name, FC, t, FC, [Name])]
-> PData' t
forall t.
Name
-> FC
-> t
-> [(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], Name, FC, t, FC, [Name])]
-> PData' t
PDatadecl ([(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns Name
n) FC
fc t
t (((Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], Name, FC, t, FC, [Name])
-> (Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], Name, FC, t, FC, [Name]))
-> [(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], Name, FC, t, FC, [Name])]
-> [(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], Name, FC, t, FC, [Name])]
forall a b. (a -> b) -> [a] -> [b]
map ([(Name, SynMatch)]
-> (Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], Name, FC, t, FC, [Name])
-> (Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], Name, FC, t, FC, [Name])
forall {a} {b} {d} {e} {f} {g}.
[(Name, SynMatch)]
-> (a, b, Name, d, e, f, g) -> (a, b, Name, d, e, f, g)
updateCon [(Name, SynMatch)]
ns) [(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], Name, FC, t, FC, [Name])]
cs)
updateData [(Name, SynMatch)]
ns (PLaterdecl Name
n FC
fc t
t)
= Name -> FC -> t -> PData' t
forall t. Name -> FC -> t -> PData' t
PLaterdecl ([(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns Name
n) FC
fc t
t
updateCon :: [(Name, SynMatch)]
-> (a, b, Name, d, e, f, g) -> (a, b, Name, d, e, f, g)
updateCon [(Name, SynMatch)]
ns (a
cd, b
ads, Name
cn, d
fc, e
ty, f
fc', g
fns)
= (a
cd, b
ads, [(Name, SynMatch)] -> Name -> Name
updateB [(Name, SynMatch)]
ns Name
cn, d
fc, e
ty, f
fc', g
fns)
ruleGroup :: [a] -> [a] -> Bool
ruleGroup [] [] = Bool
True
ruleGroup (a
s1:[a]
_) (a
s2:[a]
_) = a
s1 a -> a -> Bool
forall a. Eq a => a -> a -> Bool
== a
s2
ruleGroup [a]
_ [a]
_ = Bool
False
extSymbol :: SSymbol -> IdrisParser (Maybe (Name, SynMatch))
extSymbol :: SSymbol -> IdrisParser (Maybe (Name, SynMatch))
extSymbol (Keyword Name
n) = Maybe (Name, SynMatch)
forall a. Maybe a
Nothing Maybe (Name, SynMatch)
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> IdrisParser (Maybe (Name, SynMatch))
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword (Name -> String
forall a. Show a => a -> String
show Name
n)
extSymbol (Expr Name
n) = do PTerm
tm <- SyntaxInfo -> IdrisParser PTerm
expr SyntaxInfo
syn
Maybe (Name, SynMatch) -> IdrisParser (Maybe (Name, SynMatch))
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Maybe (Name, SynMatch) -> IdrisParser (Maybe (Name, SynMatch)))
-> Maybe (Name, SynMatch) -> IdrisParser (Maybe (Name, SynMatch))
forall a b. (a -> b) -> a -> b
$ (Name, SynMatch) -> Maybe (Name, SynMatch)
forall a. a -> Maybe a
Just (Name
n, PTerm -> SynMatch
SynTm PTerm
tm)
extSymbol (SimpleExpr Name
n) = do PTerm
tm <- SyntaxInfo -> IdrisParser PTerm
simpleExpr SyntaxInfo
syn
Maybe (Name, SynMatch) -> IdrisParser (Maybe (Name, SynMatch))
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Maybe (Name, SynMatch) -> IdrisParser (Maybe (Name, SynMatch)))
-> Maybe (Name, SynMatch) -> IdrisParser (Maybe (Name, SynMatch))
forall a b. (a -> b) -> a -> b
$ (Name, SynMatch) -> Maybe (Name, SynMatch)
forall a. a -> Maybe a
Just (Name
n, PTerm -> SynMatch
SynTm PTerm
tm)
extSymbol (Binding Name
n) = do (Name
b, FC
fc) <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
name
Maybe (Name, SynMatch) -> IdrisParser (Maybe (Name, SynMatch))
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Maybe (Name, SynMatch) -> IdrisParser (Maybe (Name, SynMatch)))
-> Maybe (Name, SynMatch) -> IdrisParser (Maybe (Name, SynMatch))
forall a b. (a -> b) -> a -> b
$ (Name, SynMatch) -> Maybe (Name, SynMatch)
forall a. a -> Maybe a
Just (Name
n, FC -> Name -> SynMatch
SynBind FC
fc Name
b)
extSymbol (Symbol String
s) = Maybe (Name, SynMatch)
forall a. Maybe a
Nothing Maybe (Name, SynMatch)
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> IdrisParser (Maybe (Name, SynMatch))
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ OutputAnnotation
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *) a.
(MonadState IState m, Parsing m) =>
OutputAnnotation -> m a -> m a
highlight OutputAnnotation
AnnKeyword (String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
symbol String
s)
syntaxDecl :: SyntaxInfo -> IdrisParser PDecl
syntaxDecl :: SyntaxInfo -> IdrisParser PDecl
syntaxDecl SyntaxInfo
syn = do (Syntax
s, FC
fc) <- StateT IState (WriterT FC (Parsec Void String)) Syntax
-> StateT IState (WriterT FC (Parsec Void String)) (Syntax, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (StateT IState (WriterT FC (Parsec Void String)) Syntax
-> StateT IState (WriterT FC (Parsec Void String)) (Syntax, FC))
-> StateT IState (WriterT FC (Parsec Void String)) Syntax
-> StateT IState (WriterT FC (Parsec Void String)) (Syntax, FC)
forall a b. (a -> b) -> a -> b
$ SyntaxInfo
-> StateT IState (WriterT FC (Parsec Void String)) Syntax
syntaxRule SyntaxInfo
syn
(IState -> IState)
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall s (m :: * -> *). MonadState s m => (s -> s) -> m ()
modify ((IState -> IState)
-> StateT IState (WriterT FC (Parsec Void String)) ())
-> (IState -> IState)
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b. (a -> b) -> a -> b
$ \IState
i -> IState
i IState -> Syntax -> IState
`addSyntax` Syntax
s
PDecl -> IdrisParser PDecl
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (FC -> Syntax -> PDecl
forall t. FC -> Syntax -> PDecl' t
PSyntax FC
fc Syntax
s)
addSyntax :: IState -> Syntax -> IState
addSyntax :: IState -> Syntax -> IState
addSyntax IState
i Syntax
s = IState
i { syntax_rules = updateSyntaxRules [s] rs,
syntax_keywords = ks ++ ns,
ibc_write = IBCSyntax s : map IBCKeyword ks ++ ibc }
where rs :: SyntaxRules
rs = IState -> SyntaxRules
syntax_rules IState
i
ns :: [String]
ns = IState -> [String]
syntax_keywords IState
i
ibc :: [IBCWrite]
ibc = IState -> [IBCWrite]
ibc_write IState
i
ks :: [String]
ks = (Name -> String) -> [Name] -> [String]
forall a b. (a -> b) -> [a] -> [b]
map Name -> String
forall a. Show a => a -> String
show (Syntax -> [Name]
syntaxNames Syntax
s)
addReplSyntax :: IState -> Syntax -> IState
addReplSyntax :: IState -> Syntax -> IState
addReplSyntax IState
i Syntax
s = IState
i { syntax_rules = updateSyntaxRules [s] rs,
syntax_keywords = ks ++ ns }
where rs :: SyntaxRules
rs = IState -> SyntaxRules
syntax_rules IState
i
ns :: [String]
ns = IState -> [String]
syntax_keywords IState
i
ks :: [String]
ks = (Name -> String) -> [Name] -> [String]
forall a b. (a -> b) -> [a] -> [b]
map Name -> String
forall a. Show a => a -> String
show (Syntax -> [Name]
syntaxNames Syntax
s)
syntaxRule :: SyntaxInfo -> IdrisParser Syntax
syntaxRule :: SyntaxInfo
-> StateT IState (WriterT FC (Parsec Void String)) Syntax
syntaxRule SyntaxInfo
syn
= do SynContext
sty <- StateT IState (WriterT FC (Parsec Void String)) SynContext
-> StateT IState (WriterT FC (Parsec Void String)) SynContext
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (do
StateT IState (WriterT FC (Parsec Void String)) ()
pushIndent
SynContext
sty <- SynContext
-> StateT IState (WriterT FC (Parsec Void String)) SynContext
-> StateT IState (WriterT FC (Parsec Void String)) SynContext
forall (m :: * -> *) a. Alternative m => a -> m a -> m a
P.option SynContext
AnySyntax
(SynContext
TermSyntax SynContext
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) SynContext
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"term"
StateT IState (WriterT FC (Parsec Void String)) SynContext
-> StateT IState (WriterT FC (Parsec Void String)) SynContext
-> StateT IState (WriterT FC (Parsec Void String)) SynContext
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SynContext
PatternSyntax SynContext
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) SynContext
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"pattern")
String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"syntax"
SynContext
-> StateT IState (WriterT FC (Parsec Void String)) SynContext
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return SynContext
sty)
[SSymbol]
syms <- StateT IState (WriterT FC (Parsec Void String)) SSymbol
-> StateT IState (WriterT FC (Parsec Void String)) [SSymbol]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
some StateT IState (WriterT FC (Parsec Void String)) SSymbol
syntaxSym
Bool
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when ((SSymbol -> Bool) -> [SSymbol] -> Bool
forall (t :: * -> *) a. Foldable t => (a -> Bool) -> t a -> Bool
all SSymbol -> Bool
isExpr [SSymbol]
syms) (StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ())
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b. (a -> b) -> a -> b
$ ErrorItem (Token String)
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall e s (m :: * -> *) a.
MonadParsec e s m =>
ErrorItem (Token s) -> m a
P.unexpected (ErrorItem (Token String)
-> StateT IState (WriterT FC (Parsec Void String)) ())
-> (String -> ErrorItem (Token String))
-> String
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. NonEmpty Char -> ErrorItem (Token String)
forall t. NonEmpty Char -> ErrorItem t
P.Label (NonEmpty Char -> ErrorItem (Token String))
-> (String -> NonEmpty Char) -> String -> ErrorItem (Token String)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> NonEmpty Char
forall a. HasCallStack => [a] -> NonEmpty a
NonEmpty.fromList (String -> StateT IState (WriterT FC (Parsec Void String)) ())
-> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b. (a -> b) -> a -> b
$ String
"missing keywords in syntax rule"
let ns :: [Name]
ns = (SSymbol -> Maybe Name) -> [SSymbol] -> [Name]
forall a b. (a -> Maybe b) -> [a] -> [b]
mapMaybe SSymbol -> Maybe Name
getName [SSymbol]
syms
Bool
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when ([Name] -> Int
forall a. [a] -> Int
forall (t :: * -> *) a. Foldable t => t a -> Int
length [Name]
ns Int -> Int -> Bool
forall a. Eq a => a -> a -> Bool
/= [Name] -> Int
forall a. [a] -> Int
forall (t :: * -> *) a. Foldable t => t a -> Int
length ([Name] -> [Name]
forall a. Eq a => [a] -> [a]
nub [Name]
ns))
(StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ())
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b. (a -> b) -> a -> b
$ ErrorItem (Token String)
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall e s (m :: * -> *) a.
MonadParsec e s m =>
ErrorItem (Token s) -> m a
P.unexpected (ErrorItem (Token String)
-> StateT IState (WriterT FC (Parsec Void String)) ())
-> (String -> ErrorItem (Token String))
-> String
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. NonEmpty Char -> ErrorItem (Token String)
forall t. NonEmpty Char -> ErrorItem t
P.Label (NonEmpty Char -> ErrorItem (Token String))
-> (String -> NonEmpty Char) -> String -> ErrorItem (Token String)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> NonEmpty Char
forall a. HasCallStack => [a] -> NonEmpty a
NonEmpty.fromList (String -> StateT IState (WriterT FC (Parsec Void String)) ())
-> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b. (a -> b) -> a -> b
$ String
"repeated variable in syntax rule"
Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'='
PTerm
tm <- SyntaxInfo -> IdrisParser PTerm
typeExpr (SyntaxInfo -> SyntaxInfo
allowImp SyntaxInfo
syn) IdrisParser PTerm
-> (PTerm -> IdrisParser PTerm) -> IdrisParser PTerm
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> (a -> StateT IState (WriterT FC (Parsec Void String)) b)
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= [Name] -> PTerm -> IdrisParser PTerm
uniquifyBinders [Name
n | Binding Name
n <- [SSymbol]
syms]
StateT IState (WriterT FC (Parsec Void String)) ()
terminator
Syntax -> StateT IState (WriterT FC (Parsec Void String)) Syntax
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return ([SSymbol] -> PTerm -> SynContext -> Syntax
Rule ([SSymbol] -> [SSymbol]
mkSimple [SSymbol]
syms) PTerm
tm SynContext
sty)
StateT IState (WriterT FC (Parsec Void String)) Syntax
-> StateT IState (WriterT FC (Parsec Void String)) Syntax
-> StateT IState (WriterT FC (Parsec Void String)) Syntax
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"decl"; String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"syntax"
[SSymbol]
syms <- StateT IState (WriterT FC (Parsec Void String)) SSymbol
-> StateT IState (WriterT FC (Parsec Void String)) [SSymbol]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
some StateT IState (WriterT FC (Parsec Void String)) SSymbol
syntaxSym
Bool
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when ((SSymbol -> Bool) -> [SSymbol] -> Bool
forall (t :: * -> *) a. Foldable t => (a -> Bool) -> t a -> Bool
all SSymbol -> Bool
isExpr [SSymbol]
syms) (StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ())
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b. (a -> b) -> a -> b
$ ErrorItem (Token String)
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall e s (m :: * -> *) a.
MonadParsec e s m =>
ErrorItem (Token s) -> m a
P.unexpected (ErrorItem (Token String)
-> StateT IState (WriterT FC (Parsec Void String)) ())
-> (String -> ErrorItem (Token String))
-> String
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. NonEmpty Char -> ErrorItem (Token String)
forall t. NonEmpty Char -> ErrorItem t
P.Label (NonEmpty Char -> ErrorItem (Token String))
-> (String -> NonEmpty Char) -> String -> ErrorItem (Token String)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> NonEmpty Char
forall a. HasCallStack => [a] -> NonEmpty a
NonEmpty.fromList (String -> StateT IState (WriterT FC (Parsec Void String)) ())
-> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b. (a -> b) -> a -> b
$ String
"missing keywords in syntax rule"
let ns :: [Name]
ns = (SSymbol -> Maybe Name) -> [SSymbol] -> [Name]
forall a b. (a -> Maybe b) -> [a] -> [b]
mapMaybe SSymbol -> Maybe Name
getName [SSymbol]
syms
Bool
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when ([Name] -> Int
forall a. [a] -> Int
forall (t :: * -> *) a. Foldable t => t a -> Int
length [Name]
ns Int -> Int -> Bool
forall a. Eq a => a -> a -> Bool
/= [Name] -> Int
forall a. [a] -> Int
forall (t :: * -> *) a. Foldable t => t a -> Int
length ([Name] -> [Name]
forall a. Eq a => [a] -> [a]
nub [Name]
ns))
(StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ())
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b. (a -> b) -> a -> b
$ ErrorItem (Token String)
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall e s (m :: * -> *) a.
MonadParsec e s m =>
ErrorItem (Token s) -> m a
P.unexpected (ErrorItem (Token String)
-> StateT IState (WriterT FC (Parsec Void String)) ())
-> (String -> ErrorItem (Token String))
-> String
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. NonEmpty Char -> ErrorItem (Token String)
forall t. NonEmpty Char -> ErrorItem t
P.Label (NonEmpty Char -> ErrorItem (Token String))
-> (String -> NonEmpty Char) -> String -> ErrorItem (Token String)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> NonEmpty Char
forall a. HasCallStack => [a] -> NonEmpty a
NonEmpty.fromList (String -> StateT IState (WriterT FC (Parsec Void String)) ())
-> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b. (a -> b) -> a -> b
$ String
"repeated variable in syntax rule"
Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'='
StateT IState (WriterT FC (Parsec Void String)) ()
openBlock
[[PDecl]]
dec <- IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
some (SyntaxInfo -> IdrisParser [PDecl]
decl SyntaxInfo
syn)
StateT IState (WriterT FC (Parsec Void String)) ()
closeBlock
Syntax -> StateT IState (WriterT FC (Parsec Void String)) Syntax
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return ([SSymbol] -> [PDecl] -> Syntax
DeclRule ([SSymbol] -> [SSymbol]
mkSimple [SSymbol]
syms) ([[PDecl]] -> [PDecl]
forall (t :: * -> *) a. Foldable t => t [a] -> [a]
concat [[PDecl]]
dec))
where
isExpr :: SSymbol -> Bool
isExpr (Expr Name
_) = Bool
True
isExpr SSymbol
_ = Bool
False
getName :: SSymbol -> Maybe Name
getName (Expr Name
n) = Name -> Maybe Name
forall a. a -> Maybe a
Just Name
n
getName SSymbol
_ = Maybe Name
forall a. Maybe a
Nothing
mkSimple :: [SSymbol] -> [SSymbol]
mkSimple (Expr Name
e : [SSymbol]
es) = Name -> SSymbol
SimpleExpr Name
e SSymbol -> [SSymbol] -> [SSymbol]
forall a. a -> [a] -> [a]
: [SSymbol] -> [SSymbol]
mkSimple' [SSymbol]
es
mkSimple [SSymbol]
xs = [SSymbol] -> [SSymbol]
mkSimple' [SSymbol]
xs
mkSimple' :: [SSymbol] -> [SSymbol]
mkSimple' (Expr Name
e : Expr Name
e1 : [SSymbol]
es) = Name -> SSymbol
SimpleExpr Name
e SSymbol -> [SSymbol] -> [SSymbol]
forall a. a -> [a] -> [a]
: Name -> SSymbol
SimpleExpr Name
e1 SSymbol -> [SSymbol] -> [SSymbol]
forall a. a -> [a] -> [a]
:
[SSymbol] -> [SSymbol]
mkSimple [SSymbol]
es
mkSimple' (Expr Name
e : Symbol String
s : [SSymbol]
es)
| (Char -> Bool) -> String -> String
forall a. (a -> Bool) -> [a] -> [a]
takeWhile (Char -> String -> Bool
forall a. Eq a => a -> [a] -> Bool
forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
`elem` String
opChars) String
ts String -> String -> Bool
forall a. Eq a => a -> a -> Bool
/= String
"" = Name -> SSymbol
SimpleExpr Name
e SSymbol -> [SSymbol] -> [SSymbol]
forall a. a -> [a] -> [a]
: String -> SSymbol
Symbol String
s SSymbol -> [SSymbol] -> [SSymbol]
forall a. a -> [a] -> [a]
: [SSymbol] -> [SSymbol]
mkSimple' [SSymbol]
es
where ts :: String
ts = (Char -> Bool) -> String -> String
forall a. (a -> Bool) -> [a] -> [a]
dropWhile Char -> Bool
isSpace (String -> String) -> (String -> String) -> String -> String
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (Char -> Bool) -> String -> String
forall a. (a -> Bool) -> [a] -> [a]
dropWhileEnd Char -> Bool
isSpace (String -> String) -> String -> String
forall a b. (a -> b) -> a -> b
$ String
s
mkSimple' (SSymbol
e : [SSymbol]
es) = SSymbol
e SSymbol -> [SSymbol] -> [SSymbol]
forall a. a -> [a] -> [a]
: [SSymbol] -> [SSymbol]
mkSimple' [SSymbol]
es
mkSimple' [] = []
uniquifyBinders :: [Name] -> PTerm -> IdrisParser PTerm
uniquifyBinders :: [Name] -> PTerm -> IdrisParser PTerm
uniquifyBinders [Name]
userNames = Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
0 []
where
fixBind :: Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind :: Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
0 [(Name, Name)]
rens (PRef FC
fc [FC]
hls Name
n) | Just Name
n' <- Name -> [(Name, Name)] -> Maybe Name
forall a b. Eq a => a -> [(a, b)] -> Maybe b
lookup Name
n [(Name, Name)]
rens =
PTerm -> IdrisParser PTerm
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (PTerm -> IdrisParser PTerm) -> PTerm -> IdrisParser PTerm
forall a b. (a -> b) -> a -> b
$ FC -> [FC] -> Name -> PTerm
PRef FC
fc [FC]
hls Name
n'
fixBind Int
0 [(Name, Name)]
rens (PPatvar FC
fc Name
n) | Just Name
n' <- Name -> [(Name, Name)] -> Maybe Name
forall a b. Eq a => a -> [(a, b)] -> Maybe b
lookup Name
n [(Name, Name)]
rens =
PTerm -> IdrisParser PTerm
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (PTerm -> IdrisParser PTerm) -> PTerm -> IdrisParser PTerm
forall a b. (a -> b) -> a -> b
$ FC -> Name -> PTerm
PPatvar FC
fc Name
n'
fixBind Int
0 [(Name, Name)]
rens (PLam FC
fc Name
n FC
nfc PTerm
ty PTerm
body)
| Name
n Name -> [Name] -> Bool
forall a. Eq a => a -> [a] -> Bool
forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
`elem` [Name]
userNames = (PTerm -> PTerm -> PTerm)
-> IdrisParser PTerm -> IdrisParser PTerm -> IdrisParser PTerm
forall (m :: * -> *) a1 a2 r.
Monad m =>
(a1 -> a2 -> r) -> m a1 -> m a2 -> m r
liftM2 (FC -> Name -> FC -> PTerm -> PTerm -> PTerm
PLam FC
fc Name
n FC
nfc)
(Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
0 [(Name, Name)]
rens PTerm
ty)
(Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
0 [(Name, Name)]
rens PTerm
body)
| Bool
otherwise =
do PTerm
ty' <- Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
0 [(Name, Name)]
rens PTerm
ty
Name
n' <- Name -> StateT IState (WriterT FC (Parsec Void String)) Name
gensym Name
n
PTerm
body' <- Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
0 ((Name
n,Name
n')(Name, Name) -> [(Name, Name)] -> [(Name, Name)]
forall a. a -> [a] -> [a]
:[(Name, Name)]
rens) PTerm
body
PTerm -> IdrisParser PTerm
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (PTerm -> IdrisParser PTerm) -> PTerm -> IdrisParser PTerm
forall a b. (a -> b) -> a -> b
$ FC -> Name -> FC -> PTerm -> PTerm -> PTerm
PLam FC
fc Name
n' FC
nfc PTerm
ty' PTerm
body'
fixBind Int
0 [(Name, Name)]
rens (PPi Plicity
plic Name
n FC
nfc PTerm
argTy PTerm
body)
| Name
n Name -> [Name] -> Bool
forall a. Eq a => a -> [a] -> Bool
forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
`elem` [Name]
userNames = (PTerm -> PTerm -> PTerm)
-> IdrisParser PTerm -> IdrisParser PTerm -> IdrisParser PTerm
forall (m :: * -> *) a1 a2 r.
Monad m =>
(a1 -> a2 -> r) -> m a1 -> m a2 -> m r
liftM2 (Plicity -> Name -> FC -> PTerm -> PTerm -> PTerm
PPi Plicity
plic Name
n FC
nfc)
(Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
0 [(Name, Name)]
rens PTerm
argTy)
(Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
0 [(Name, Name)]
rens PTerm
body)
| Bool
otherwise =
do PTerm
ty' <- Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
0 [(Name, Name)]
rens PTerm
argTy
Name
n' <- Name -> StateT IState (WriterT FC (Parsec Void String)) Name
gensym Name
n
PTerm
body' <- Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
0 ((Name
n,Name
n')(Name, Name) -> [(Name, Name)] -> [(Name, Name)]
forall a. a -> [a] -> [a]
:[(Name, Name)]
rens) PTerm
body
PTerm -> IdrisParser PTerm
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (PTerm -> IdrisParser PTerm) -> PTerm -> IdrisParser PTerm
forall a b. (a -> b) -> a -> b
$ (Plicity -> Name -> FC -> PTerm -> PTerm -> PTerm
PPi Plicity
plic Name
n' FC
nfc PTerm
ty' PTerm
body')
fixBind Int
0 [(Name, Name)]
rens (PLet FC
fc RigCount
rig Name
n FC
nfc PTerm
ty PTerm
val PTerm
body)
| Name
n Name -> [Name] -> Bool
forall a. Eq a => a -> [a] -> Bool
forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
`elem` [Name]
userNames = (PTerm -> PTerm -> PTerm -> PTerm)
-> IdrisParser PTerm
-> IdrisParser PTerm
-> IdrisParser PTerm
-> IdrisParser PTerm
forall (m :: * -> *) a1 a2 a3 r.
Monad m =>
(a1 -> a2 -> a3 -> r) -> m a1 -> m a2 -> m a3 -> m r
liftM3 (FC -> RigCount -> Name -> FC -> PTerm -> PTerm -> PTerm -> PTerm
PLet FC
fc RigCount
rig Name
n FC
nfc)
(Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
0 [(Name, Name)]
rens PTerm
ty)
(Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
0 [(Name, Name)]
rens PTerm
val)
(Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
0 [(Name, Name)]
rens PTerm
body)
| Bool
otherwise =
do PTerm
ty' <- Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
0 [(Name, Name)]
rens PTerm
ty
PTerm
val' <- Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
0 [(Name, Name)]
rens PTerm
val
Name
n' <- Name -> StateT IState (WriterT FC (Parsec Void String)) Name
gensym Name
n
PTerm
body' <- Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
0 ((Name
n,Name
n')(Name, Name) -> [(Name, Name)] -> [(Name, Name)]
forall a. a -> [a] -> [a]
:[(Name, Name)]
rens) PTerm
body
PTerm -> IdrisParser PTerm
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (PTerm -> IdrisParser PTerm) -> PTerm -> IdrisParser PTerm
forall a b. (a -> b) -> a -> b
$ FC -> RigCount -> Name -> FC -> PTerm -> PTerm -> PTerm -> PTerm
PLet FC
fc RigCount
rig Name
n' FC
nfc PTerm
ty' PTerm
val' PTerm
body'
fixBind Int
0 [(Name, Name)]
rens (PMatchApp FC
fc Name
n) | Just Name
n' <- Name -> [(Name, Name)] -> Maybe Name
forall a b. Eq a => a -> [(a, b)] -> Maybe b
lookup Name
n [(Name, Name)]
rens =
PTerm -> IdrisParser PTerm
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (PTerm -> IdrisParser PTerm) -> PTerm -> IdrisParser PTerm
forall a b. (a -> b) -> a -> b
$ FC -> Name -> PTerm
PMatchApp FC
fc Name
n'
fixBind Int
0 [(Name, Name)]
rens (PQuoteName Name
n Bool
True FC
fc) | Just Name
n' <- Name -> [(Name, Name)] -> Maybe Name
forall a b. Eq a => a -> [(a, b)] -> Maybe b
lookup Name
n [(Name, Name)]
rens =
PTerm -> IdrisParser PTerm
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (PTerm -> IdrisParser PTerm) -> PTerm -> IdrisParser PTerm
forall a b. (a -> b) -> a -> b
$ Name -> Bool -> FC -> PTerm
PQuoteName Name
n' Bool
True FC
fc
fixBind Int
q [(Name, Name)]
rens (PQuasiquote PTerm
tm Maybe PTerm
goal) =
(PTerm -> Maybe PTerm -> PTerm) -> Maybe PTerm -> PTerm -> PTerm
forall a b c. (a -> b -> c) -> b -> a -> c
flip PTerm -> Maybe PTerm -> PTerm
PQuasiquote Maybe PTerm
goal (PTerm -> PTerm) -> IdrisParser PTerm -> IdrisParser PTerm
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind (Int
q Int -> Int -> Int
forall a. Num a => a -> a -> a
+ Int
1) [(Name, Name)]
rens PTerm
tm
fixBind Int
q [(Name, Name)]
rens (PUnquote PTerm
tm) =
PTerm -> PTerm
PUnquote (PTerm -> PTerm) -> IdrisParser PTerm -> IdrisParser PTerm
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind (Int
q Int -> Int -> Int
forall a. Num a => a -> a -> a
- Int
1) [(Name, Name)]
rens PTerm
tm
fixBind Int
q [(Name, Name)]
rens PTerm
x = (PTerm -> IdrisParser PTerm) -> PTerm -> IdrisParser PTerm
forall on (m :: * -> *).
(Uniplate on, Applicative m) =>
(on -> m on) -> on -> m on
forall (m :: * -> *).
Applicative m =>
(PTerm -> m PTerm) -> PTerm -> m PTerm
descendM (Int -> [(Name, Name)] -> PTerm -> IdrisParser PTerm
fixBind Int
q [(Name, Name)]
rens) PTerm
x
gensym :: Name -> IdrisParser Name
gensym :: Name -> StateT IState (WriterT FC (Parsec Void String)) Name
gensym Name
n = do IState
ist <- StateT IState (WriterT FC (Parsec Void String)) IState
forall s (m :: * -> *). MonadState s m => m s
get
let idx :: Int
idx = IState -> Int
idris_name IState
ist
IState -> StateT IState (WriterT FC (Parsec Void String)) ()
forall s (m :: * -> *). MonadState s m => s -> m ()
put IState
ist { idris_name = idx + 1 }
Name -> StateT IState (WriterT FC (Parsec Void String)) Name
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Name -> StateT IState (WriterT FC (Parsec Void String)) Name)
-> Name -> StateT IState (WriterT FC (Parsec Void String)) Name
forall a b. (a -> b) -> a -> b
$ Int -> String -> Name
sMN Int
idx (Name -> String
forall a. Show a => a -> String
show Name
n)
syntaxSym :: IdrisParser SSymbol
syntaxSym :: StateT IState (WriterT FC (Parsec Void String)) SSymbol
syntaxSym = StateT IState (WriterT FC (Parsec Void String)) SSymbol
-> StateT IState (WriterT FC (Parsec Void String)) SSymbol
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (do Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'['; Name
n <- StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
name; Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
']'
SSymbol -> StateT IState (WriterT FC (Parsec Void String)) SSymbol
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Name -> SSymbol
Expr Name
n))
StateT IState (WriterT FC (Parsec Void String)) SSymbol
-> StateT IState (WriterT FC (Parsec Void String)) SSymbol
-> StateT IState (WriterT FC (Parsec Void String)) SSymbol
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> StateT IState (WriterT FC (Parsec Void String)) SSymbol
-> StateT IState (WriterT FC (Parsec Void String)) SSymbol
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (do Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'{'; Name
n <- StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
name; Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'}'
SSymbol -> StateT IState (WriterT FC (Parsec Void String)) SSymbol
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Name -> SSymbol
Binding Name
n))
StateT IState (WriterT FC (Parsec Void String)) SSymbol
-> StateT IState (WriterT FC (Parsec Void String)) SSymbol
-> StateT IState (WriterT FC (Parsec Void String)) SSymbol
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do Name
n <- [String] -> StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). Parsing m => [String] -> m Name
iName []
SSymbol -> StateT IState (WriterT FC (Parsec Void String)) SSymbol
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Name -> SSymbol
Keyword Name
n)
StateT IState (WriterT FC (Parsec Void String)) SSymbol
-> StateT IState (WriterT FC (Parsec Void String)) SSymbol
-> StateT IState (WriterT FC (Parsec Void String)) SSymbol
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do String
sym <- StateT IState (WriterT FC (Parsec Void String)) String
forall (m :: * -> *). Parsing m => m String
stringLiteral
SSymbol -> StateT IState (WriterT FC (Parsec Void String)) SSymbol
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (String -> SSymbol
Symbol String
sym)
StateT IState (WriterT FC (Parsec Void String)) SSymbol
-> String
-> StateT IState (WriterT FC (Parsec Void String)) SSymbol
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"syntax symbol"
fnDecl :: SyntaxInfo -> IdrisParser [PDecl]
fnDecl :: SyntaxInfo -> IdrisParser [PDecl]
fnDecl SyntaxInfo
syn = IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (do StateT IState (WriterT FC (Parsec Void String)) ()
notEndBlock
PDecl
d <- SyntaxInfo -> IdrisParser PDecl
fnDecl' SyntaxInfo
syn
IState
i <- StateT IState (WriterT FC (Parsec Void String)) IState
forall s (m :: * -> *). MonadState s m => m s
get
let d' :: PDecl
d' = (PTerm -> PTerm) -> PDecl -> PDecl
forall a b. (a -> b) -> PDecl' a -> PDecl' b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap (SyntaxInfo -> PTerm -> PTerm
debindApp SyntaxInfo
syn (PTerm -> PTerm) -> (PTerm -> PTerm) -> PTerm -> PTerm
forall b c a. (b -> c) -> (a -> b) -> a -> c
. SyntaxInfo -> IState -> PTerm -> PTerm
desugar SyntaxInfo
syn IState
i) PDecl
d
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [PDecl
d']) IdrisParser [PDecl] -> String -> IdrisParser [PDecl]
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"function declaration"
fnDecl' :: SyntaxInfo -> IdrisParser PDecl
fnDecl' :: SyntaxInfo -> IdrisParser PDecl
fnDecl' SyntaxInfo
syn = (IdrisParser PDecl -> IdrisParser PDecl
checkDeclFixity (IdrisParser PDecl -> IdrisParser PDecl)
-> IdrisParser PDecl -> IdrisParser PDecl
forall a b. (a -> b) -> a -> b
$
do (Docstring (Either Err PTerm)
doc, [(Name, Docstring (Either Err PTerm))]
argDocs, FC
fc, FnOpts
opts', Name
n, FC
nfc, Accessibility
acc) <- StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], FC, FnOpts, Name, FC,
Accessibility)
-> StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], FC, FnOpts, Name, FC,
Accessibility)
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (do
StateT IState (WriterT FC (Parsec Void String)) ()
pushIndent
(Docstring (Either Err PTerm)
doc, [(Name, Docstring (Either Err PTerm))]
argDocs) <- SyntaxInfo
-> IdrisParser
(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))])
docstring SyntaxInfo
syn
(FnOpts
opts, Accessibility
acc) <- IdrisParser (FnOpts, Accessibility)
fnOpts
(Name
n_in, FC
nfc) <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
let n :: Name
n = SyntaxInfo -> Name -> Name
expandNS SyntaxInfo
syn Name
n_in
FC
fc <- StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall (m :: * -> *) a. MonadWriter FC m => m a -> m FC
extent (StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) FC)
-> StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall a b. (a -> b) -> a -> b
$ Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
':'
(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], FC, FnOpts, Name, FC,
Accessibility)
-> StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], FC, FnOpts, Name, FC,
Accessibility)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Docstring (Either Err PTerm)
doc, [(Name, Docstring (Either Err PTerm))]
argDocs, FC
fc, FnOpts
opts, Name
n, FC
nfc, Accessibility
acc))
PTerm
ty <- SyntaxInfo -> IdrisParser PTerm
typeExpr (SyntaxInfo -> SyntaxInfo
allowImp SyntaxInfo
syn)
StateT IState (WriterT FC (Parsec Void String)) ()
terminator
Bool
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (SyntaxInfo -> Bool
syn_toplevel SyntaxInfo
syn) (StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ())
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b. (a -> b) -> a -> b
$ Name
-> Accessibility
-> StateT IState (WriterT FC (Parsec Void String)) ()
addAcc Name
n Accessibility
acc
PDecl -> IdrisParser PDecl
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Docstring (Either Err PTerm)
-> [(Name, Docstring (Either Err PTerm))]
-> SyntaxInfo
-> FC
-> FnOpts
-> Name
-> FC
-> PTerm
-> PDecl
forall t.
Docstring (Either Err t)
-> [(Name, Docstring (Either Err t))]
-> SyntaxInfo
-> FC
-> FnOpts
-> Name
-> FC
-> t
-> PDecl' t
PTy Docstring (Either Err PTerm)
doc [(Name, Docstring (Either Err PTerm))]
argDocs SyntaxInfo
syn FC
fc FnOpts
opts' Name
n FC
nfc PTerm
ty)
IdrisParser PDecl -> IdrisParser PDecl -> IdrisParser PDecl
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser PDecl
postulate SyntaxInfo
syn
IdrisParser PDecl -> IdrisParser PDecl -> IdrisParser PDecl
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser PDecl
caf SyntaxInfo
syn
IdrisParser PDecl -> IdrisParser PDecl -> IdrisParser PDecl
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser PDecl
pattern SyntaxInfo
syn)
IdrisParser PDecl -> String -> IdrisParser PDecl
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"function declaration"
fnOpts :: IdrisParser ([FnOpt], Accessibility)
fnOpts :: IdrisParser (FnOpts, Accessibility)
fnOpts = do
FnOpts
opts <- StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpts
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many StateT IState (WriterT FC (Parsec Void String)) FnOpt
fnOpt
Accessibility
acc <- IdrisParser Accessibility
accessibility
FnOpts
opts' <- StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpts
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many StateT IState (WriterT FC (Parsec Void String)) FnOpt
fnOpt
let allOpts :: FnOpts
allOpts = FnOpts
opts FnOpts -> FnOpts -> FnOpts
forall a. [a] -> [a] -> [a]
++ FnOpts
opts'
let existingTotality :: FnOpts
existingTotality = FnOpts
allOpts FnOpts -> FnOpts -> FnOpts
forall a. Eq a => [a] -> [a] -> [a]
`intersect` [FnOpt
TotalFn, FnOpt
CoveringFn, FnOpt
PartialFn]
FnOpts
opts'' <- FnOpts
-> FnOpts -> StateT IState (WriterT FC (Parsec Void String)) FnOpts
forall {m :: * -> *}.
(MonadState IState m, MonadFail m) =>
FnOpts -> FnOpts -> m FnOpts
addDefaultTotality (FnOpts -> FnOpts
forall a. Eq a => [a] -> [a]
nub FnOpts
existingTotality) FnOpts
allOpts
(FnOpts, Accessibility) -> IdrisParser (FnOpts, Accessibility)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (FnOpts
opts'', Accessibility
acc)
where prettyTot :: FnOpt -> String
prettyTot FnOpt
TotalFn = String
"total"
prettyTot FnOpt
PartialFn = String
"partial"
prettyTot FnOpt
CoveringFn = String
"covering"
addDefaultTotality :: FnOpts -> FnOpts -> m FnOpts
addDefaultTotality [] FnOpts
opts = do
IState
ist <- m IState
forall s (m :: * -> *). MonadState s m => m s
get
case IState -> DefaultTotality
default_total IState
ist of
DefaultTotality
DefaultCheckingTotal -> FnOpts -> m FnOpts
forall a. a -> m a
forall (m :: * -> *) a. Monad m => a -> m a
return (FnOpt
TotalFnFnOpt -> FnOpts -> FnOpts
forall a. a -> [a] -> [a]
:FnOpts
opts)
DefaultTotality
DefaultCheckingCovering -> FnOpts -> m FnOpts
forall a. a -> m a
forall (m :: * -> *) a. Monad m => a -> m a
return (FnOpt
CoveringFnFnOpt -> FnOpts -> FnOpts
forall a. a -> [a] -> [a]
:FnOpts
opts)
DefaultTotality
DefaultCheckingPartial -> FnOpts -> m FnOpts
forall a. a -> m a
forall (m :: * -> *) a. Monad m => a -> m a
return FnOpts
opts
addDefaultTotality [FnOpt
tot] FnOpts
opts = FnOpts -> m FnOpts
forall a. a -> m a
forall (m :: * -> *) a. Monad m => a -> m a
return FnOpts
opts
addDefaultTotality (FnOpt
tot1:FnOpt
tot2:FnOpts
tots) FnOpts
opts =
String -> m FnOpts
forall a. String -> m a
forall (m :: * -> *) a. MonadFail m => String -> m a
fail (String
"Conflicting totality modifiers specified " String -> String -> String
forall a. [a] -> [a] -> [a]
++ FnOpt -> String
prettyTot FnOpt
tot1 String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
" and " String -> String -> String
forall a. [a] -> [a] -> [a]
++ FnOpt -> String
prettyTot FnOpt
tot2)
fnOpt :: IdrisParser FnOpt
fnOpt :: StateT IState (WriterT FC (Parsec Void String)) FnOpt
fnOpt = do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"total"; FnOpt -> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return FnOpt
TotalFn
StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> FnOpt
PartialFn FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"partial"
StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> FnOpt
CoveringFn FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"covering"
StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"export"); String
c <- StateT IState (WriterT FC (Parsec Void String)) String
forall (m :: * -> *). Parsing m => m String
stringLiteral;
FnOpt -> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (FnOpt -> StateT IState (WriterT FC (Parsec Void String)) FnOpt)
-> FnOpt -> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a b. (a -> b) -> a -> b
$ String -> FnOpt
CExport String
c
StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> FnOpt
NoImplicit FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"no_implicit")
StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> FnOpt
Inlinable FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"inline")
StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> FnOpt
StaticFn FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"static")
StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> FnOpt
ErrorHandler FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"error_handler")
StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> FnOpt
ErrorReverse FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"error_reverse")
StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> FnOpt
ErrorReduce FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"error_reduce")
StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> FnOpt
Reflection FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"reflection")
StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> FnOpt
AutoHint FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"hint")
StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> FnOpt
OverlappingDictionary FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"overlapping")
StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%'; String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"specialise";
Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'['; [(Name, Maybe Int)]
ns <- StateT IState (WriterT FC (Parsec Void String)) (Name, Maybe Int)
-> StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT
IState (WriterT FC (Parsec Void String)) [(Name, Maybe Int)]
forall (m :: * -> *) a sep. MonadPlus m => m a -> m sep -> m [a]
P.sepBy StateT IState (WriterT FC (Parsec Void String)) (Name, Maybe Int)
nameTimes (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
','); Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
']';
FnOpt -> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (FnOpt -> StateT IState (WriterT FC (Parsec Void String)) FnOpt)
-> FnOpt -> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a b. (a -> b) -> a -> b
$ [(Name, Maybe Int)] -> FnOpt
Specialise [(Name, Maybe Int)]
ns
StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> FnOpt
Implicit FnOpt
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"implicit"
StateT IState (WriterT FC (Parsec Void String)) FnOpt
-> String -> StateT IState (WriterT FC (Parsec Void String)) FnOpt
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"function modifier"
where nameTimes :: IdrisParser (Name, Maybe Int)
nameTimes :: StateT IState (WriterT FC (Parsec Void String)) (Name, Maybe Int)
nameTimes = do Name
n <- StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
Maybe Int
t <- Maybe Int
-> StateT IState (WriterT FC (Parsec Void String)) (Maybe Int)
-> StateT IState (WriterT FC (Parsec Void String)) (Maybe Int)
forall (m :: * -> *) a. Alternative m => a -> m a -> m a
P.option Maybe Int
forall a. Maybe a
Nothing (do Integer
reds <- StateT IState (WriterT FC (Parsec Void String)) Integer
forall (m :: * -> *). Parsing m => m Integer
natural
Maybe Int
-> StateT IState (WriterT FC (Parsec Void String)) (Maybe Int)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Int -> Maybe Int
forall a. a -> Maybe a
Just (Integer -> Int
forall a. Num a => Integer -> a
fromInteger Integer
reds)))
(Name, Maybe Int)
-> StateT
IState (WriterT FC (Parsec Void String)) (Name, Maybe Int)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Name
n, Maybe Int
t)
postulate :: SyntaxInfo -> IdrisParser PDecl
postulate :: SyntaxInfo -> IdrisParser PDecl
postulate SyntaxInfo
syn = do (Docstring (Either Err PTerm)
doc, Bool
ext)
<- StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (Either Err PTerm), Bool)
-> StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (Either Err PTerm), Bool)
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (Either Err PTerm), Bool)
-> StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (Either Err PTerm), Bool))
-> StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (Either Err PTerm), Bool)
-> StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (Either Err PTerm), Bool)
forall a b. (a -> b) -> a -> b
$ do (Docstring (Either Err PTerm)
doc, [(Name, Docstring (Either Err PTerm))]
_) <- SyntaxInfo
-> IdrisParser
(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))])
docstring SyntaxInfo
syn
StateT IState (WriterT FC (Parsec Void String)) ()
pushIndent
Bool
ext <- StateT IState (WriterT FC (Parsec Void String)) Bool
ppostDecl
(Docstring (Either Err PTerm), Bool)
-> StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (Either Err PTerm), Bool)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Docstring (Either Err PTerm)
doc, Bool
ext)
IState
ist <- StateT IState (WriterT FC (Parsec Void String)) IState
forall s (m :: * -> *). MonadState s m => m s
get
(FnOpts
opts, Accessibility
acc) <- IdrisParser (FnOpts, Accessibility)
fnOpts
(Name
n_in, FC
nfc) <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
let n :: Name
n = SyntaxInfo -> Name -> Name
expandNS SyntaxInfo
syn Name
n_in
Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
':'
PTerm
ty <- SyntaxInfo -> IdrisParser PTerm
typeExpr (SyntaxInfo -> SyntaxInfo
allowImp SyntaxInfo
syn)
FC
fc <- StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall (m :: * -> *) a. MonadWriter FC m => m a -> m FC
extent (StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC)
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall a b. (a -> b) -> a -> b
$ StateT IState (WriterT FC (Parsec Void String)) ()
terminator
Name
-> Accessibility
-> StateT IState (WriterT FC (Parsec Void String)) ()
addAcc Name
n Accessibility
acc
PDecl -> IdrisParser PDecl
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Bool
-> Docstring (Either Err PTerm)
-> SyntaxInfo
-> FC
-> FC
-> FnOpts
-> Name
-> PTerm
-> PDecl
forall t.
Bool
-> Docstring (Either Err t)
-> SyntaxInfo
-> FC
-> FC
-> FnOpts
-> Name
-> t
-> PDecl' t
PPostulate Bool
ext Docstring (Either Err PTerm)
doc SyntaxInfo
syn FC
fc FC
nfc FnOpts
opts Name
n PTerm
ty)
IdrisParser PDecl -> String -> IdrisParser PDecl
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"postulate"
where ppostDecl :: StateT IState (WriterT FC (Parsec Void String)) Bool
ppostDecl = do ()
fc <- String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"postulate"; Bool -> StateT IState (WriterT FC (Parsec Void String)) Bool
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
False
StateT IState (WriterT FC (Parsec Void String)) Bool
-> StateT IState (WriterT FC (Parsec Void String)) Bool
-> StateT IState (WriterT FC (Parsec Void String)) Bool
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%'; String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"extern"; Bool -> StateT IState (WriterT FC (Parsec Void String)) Bool
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
True
using_ :: SyntaxInfo -> IdrisParser [PDecl]
using_ :: SyntaxInfo -> IdrisParser [PDecl]
using_ SyntaxInfo
syn =
do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"using"
Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'('; [Using]
ns <- SyntaxInfo -> IdrisParser [Using]
usingDeclList SyntaxInfo
syn; Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
')'
StateT IState (WriterT FC (Parsec Void String)) ()
openBlock
let uvars :: [Using]
uvars = SyntaxInfo -> [Using]
using SyntaxInfo
syn
[[PDecl]]
ds <- IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many (SyntaxInfo -> IdrisParser [PDecl]
decl (SyntaxInfo
syn { using = uvars ++ ns }))
StateT IState (WriterT FC (Parsec Void String)) ()
closeBlock
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return ([[PDecl]] -> [PDecl]
forall (t :: * -> *) a. Foldable t => t [a] -> [a]
concat [[PDecl]]
ds)
IdrisParser [PDecl] -> String -> IdrisParser [PDecl]
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"using declaration"
params :: SyntaxInfo -> IdrisParser [PDecl]
params :: SyntaxInfo -> IdrisParser [PDecl]
params SyntaxInfo
syn =
do ([(RigCount, Name, FC, PTerm)]
ns, FC
fc) <- StateT
IState
(WriterT FC (Parsec Void String))
[(RigCount, Name, FC, PTerm)]
-> StateT
IState
(WriterT FC (Parsec Void String))
([(RigCount, Name, FC, PTerm)], FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (StateT
IState
(WriterT FC (Parsec Void String))
[(RigCount, Name, FC, PTerm)]
-> StateT
IState
(WriterT FC (Parsec Void String))
([(RigCount, Name, FC, PTerm)], FC))
-> StateT
IState
(WriterT FC (Parsec Void String))
[(RigCount, Name, FC, PTerm)]
-> StateT
IState
(WriterT FC (Parsec Void String))
([(RigCount, Name, FC, PTerm)], FC)
forall a b. (a -> b) -> a -> b
$ do
String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"parameters"
Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'(' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT
IState
(WriterT FC (Parsec Void String))
[(RigCount, Name, FC, PTerm)]
-> StateT
IState
(WriterT FC (Parsec Void String))
[(RigCount, Name, FC, PTerm)]
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> SyntaxInfo
-> StateT
IState
(WriterT FC (Parsec Void String))
[(RigCount, Name, FC, PTerm)]
typeDeclList SyntaxInfo
syn StateT
IState
(WriterT FC (Parsec Void String))
[(RigCount, Name, FC, PTerm)]
-> StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT
IState
(WriterT FC (Parsec Void String))
[(RigCount, Name, FC, PTerm)]
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f a
<* Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
')'
let ns' :: [(Name, PTerm)]
ns' = [(Name
n, PTerm
ty) | (RigCount
_, Name
n, FC
_, PTerm
ty) <- [(RigCount, Name, FC, PTerm)]
ns]
StateT IState (WriterT FC (Parsec Void String)) ()
openBlock
let pvars :: [(Name, PTerm)]
pvars = SyntaxInfo -> [(Name, PTerm)]
syn_params SyntaxInfo
syn
[[PDecl]]
ds <- IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many (SyntaxInfo -> IdrisParser [PDecl]
decl SyntaxInfo
syn { syn_params = pvars ++ ns' })
StateT IState (WriterT FC (Parsec Void String)) ()
closeBlock
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [FC -> [(Name, PTerm)] -> [PDecl] -> PDecl
forall t. FC -> [(Name, t)] -> [PDecl' t] -> PDecl' t
PParams FC
fc [(Name, PTerm)]
ns' ([[PDecl]] -> [PDecl]
forall (t :: * -> *) a. Foldable t => t [a] -> [a]
concat [[PDecl]]
ds)]
IdrisParser [PDecl] -> String -> IdrisParser [PDecl]
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"parameters declaration"
openInterface :: SyntaxInfo -> IdrisParser [PDecl]
openInterface :: SyntaxInfo -> IdrisParser [PDecl]
openInterface SyntaxInfo
syn =
do ([(Name, FC)]
ns, FC
fc) <- StateT IState (WriterT FC (Parsec Void String)) [(Name, FC)]
-> StateT
IState (WriterT FC (Parsec Void String)) ([(Name, FC)], FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (StateT IState (WriterT FC (Parsec Void String)) [(Name, FC)]
-> StateT
IState (WriterT FC (Parsec Void String)) ([(Name, FC)], FC))
-> StateT IState (WriterT FC (Parsec Void String)) [(Name, FC)]
-> StateT
IState (WriterT FC (Parsec Void String)) ([(Name, FC)], FC)
forall a b. (a -> b) -> a -> b
$ do
String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"using"
String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"implementation"
StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
-> StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) [(Name, FC)]
forall (m :: * -> *) a sep. MonadPlus m => m a -> m sep -> m [a]
P.sepBy1 (StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName) (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
',')
StateT IState (WriterT FC (Parsec Void String)) ()
openBlock
[[PDecl]]
ds <- IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many (SyntaxInfo -> IdrisParser [PDecl]
decl SyntaxInfo
syn)
StateT IState (WriterT FC (Parsec Void String)) ()
closeBlock
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [FC -> [Name] -> [PDecl] -> PDecl
forall t. FC -> [Name] -> [PDecl' t] -> PDecl' t
POpenInterfaces FC
fc (((Name, FC) -> Name) -> [(Name, FC)] -> [Name]
forall a b. (a -> b) -> [a] -> [b]
map (Name, FC) -> Name
forall a b. (a, b) -> a
fst [(Name, FC)]
ns) ([[PDecl]] -> [PDecl]
forall (t :: * -> *) a. Foldable t => t [a] -> [a]
concat [[PDecl]]
ds)]
IdrisParser [PDecl] -> String -> IdrisParser [PDecl]
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"open interface declaration"
mutual :: SyntaxInfo -> IdrisParser [PDecl]
mutual :: SyntaxInfo -> IdrisParser [PDecl]
mutual SyntaxInfo
syn =
do FC
fc <- StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall (m :: * -> *) a. MonadWriter FC m => m a -> m FC
extent (StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC)
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall a b. (a -> b) -> a -> b
$ String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"mutual"
StateT IState (WriterT FC (Parsec Void String)) ()
openBlock
[[PDecl]]
ds <- IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many (SyntaxInfo -> IdrisParser [PDecl]
decl (SyntaxInfo
syn { mut_nesting = mut_nesting syn + 1 } ))
StateT IState (WriterT FC (Parsec Void String)) ()
closeBlock
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [FC -> [PDecl] -> PDecl
forall t. FC -> [PDecl' t] -> PDecl' t
PMutual FC
fc ([[PDecl]] -> [PDecl]
forall (t :: * -> *) a. Foldable t => t [a] -> [a]
concat [[PDecl]]
ds)]
IdrisParser [PDecl] -> String -> IdrisParser [PDecl]
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"mutual block"
namespace :: SyntaxInfo -> IdrisParser [PDecl]
namespace :: SyntaxInfo -> IdrisParser [PDecl]
namespace SyntaxInfo
syn =
do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"namespace"
(String
n, FC
nfc) <- StateT IState (WriterT FC (Parsec Void String)) String
-> StateT IState (WriterT FC (Parsec Void String)) (String, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) String
forall (m :: * -> *). Parsing m => m String
identifier
StateT IState (WriterT FC (Parsec Void String)) ()
openBlock
[[PDecl]]
ds <- IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
some (SyntaxInfo -> IdrisParser [PDecl]
decl SyntaxInfo
syn { syn_namespace = n : syn_namespace syn })
StateT IState (WriterT FC (Parsec Void String)) ()
closeBlock
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [String -> FC -> [PDecl] -> PDecl
forall t. String -> FC -> [PDecl' t] -> PDecl' t
PNamespace String
n FC
nfc ([[PDecl]] -> [PDecl]
forall (t :: * -> *) a. Foldable t => t [a] -> [a]
concat [[PDecl]]
ds)]
IdrisParser [PDecl] -> String -> IdrisParser [PDecl]
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"namespace declaration"
implementationBlock :: SyntaxInfo -> IdrisParser [PDecl]
implementationBlock :: SyntaxInfo -> IdrisParser [PDecl]
implementationBlock SyntaxInfo
syn = do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"where"
StateT IState (WriterT FC (Parsec Void String)) ()
openBlock
[[PDecl]]
ds <- IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many (SyntaxInfo -> IdrisParser [PDecl]
fnDecl SyntaxInfo
syn)
StateT IState (WriterT FC (Parsec Void String)) ()
closeBlock
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return ([[PDecl]] -> [PDecl]
forall (t :: * -> *) a. Foldable t => t [a] -> [a]
concat [[PDecl]]
ds)
IdrisParser [PDecl] -> String -> IdrisParser [PDecl]
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"implementation block"
interfaceBlock :: SyntaxInfo -> IdrisParser (Maybe (Name, FC), Docstring (Either Err PTerm), [PDecl])
interfaceBlock :: SyntaxInfo
-> IdrisParser
(Maybe (Name, FC), Docstring (Either Err PTerm), [PDecl])
interfaceBlock SyntaxInfo
syn = do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"where"
StateT IState (WriterT FC (Parsec Void String)) ()
openBlock
(Maybe (Name, FC)
cn, Docstring ()
cd) <- (Maybe (Name, FC), Docstring ())
-> StateT
IState
(WriterT FC (Parsec Void String))
(Maybe (Name, FC), Docstring ())
-> StateT
IState
(WriterT FC (Parsec Void String))
(Maybe (Name, FC), Docstring ())
forall (m :: * -> *) a. Alternative m => a -> m a -> m a
P.option (Maybe (Name, FC)
forall a. Maybe a
Nothing, Docstring ()
forall a. Docstring a
emptyDocstring) (StateT
IState
(WriterT FC (Parsec Void String))
(Maybe (Name, FC), Docstring ())
-> StateT
IState
(WriterT FC (Parsec Void String))
(Maybe (Name, FC), Docstring ()))
-> StateT
IState
(WriterT FC (Parsec Void String))
(Maybe (Name, FC), Docstring ())
-> StateT
IState
(WriterT FC (Parsec Void String))
(Maybe (Name, FC), Docstring ())
forall a b. (a -> b) -> a -> b
$
StateT
IState
(WriterT FC (Parsec Void String))
(Maybe (Name, FC), Docstring ())
-> StateT
IState
(WriterT FC (Parsec Void String))
(Maybe (Name, FC), Docstring ())
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (do (Docstring ()
doc, [(Name, Docstring ())]
_) <- (Docstring (), [(Name, Docstring ())])
-> StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (), [(Name, Docstring ())])
-> StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (), [(Name, Docstring ())])
forall (m :: * -> *) a. Alternative m => a -> m a -> m a
P.option (Docstring (), [(Name, Docstring ())])
forall a. (Docstring a, [(Name, Docstring a)])
noDocs StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (), [(Name, Docstring ())])
docComment
(Name, FC)
n <- StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
constructor
(Maybe (Name, FC), Docstring ())
-> StateT
IState
(WriterT FC (Parsec Void String))
(Maybe (Name, FC), Docstring ())
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return ((Name, FC) -> Maybe (Name, FC)
forall a. a -> Maybe a
Just (Name, FC)
n, Docstring ()
doc))
IState
ist <- StateT IState (WriterT FC (Parsec Void String)) IState
forall s (m :: * -> *). MonadState s m => m s
get
let cd' :: Docstring (Either Err PTerm)
cd' = SyntaxInfo
-> IState -> Docstring () -> Docstring (Either Err PTerm)
annotate SyntaxInfo
syn IState
ist Docstring ()
cd
[[PDecl]]
ds <- IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many (StateT IState (WriterT FC (Parsec Void String)) ()
notEndBlock StateT IState (WriterT FC (Parsec Void String)) ()
-> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (SyntaxInfo -> IdrisParser [PDecl]
implementation SyntaxInfo
syn)
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do PDecl
x <- SyntaxInfo -> IdrisParser PDecl
data_ SyntaxInfo
syn
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [PDecl
x]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser [PDecl]
fnDecl SyntaxInfo
syn)
StateT IState (WriterT FC (Parsec Void String)) ()
closeBlock
(Maybe (Name, FC), Docstring (Either Err PTerm), [PDecl])
-> IdrisParser
(Maybe (Name, FC), Docstring (Either Err PTerm), [PDecl])
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Maybe (Name, FC)
cn, Docstring (Either Err PTerm)
cd', [[PDecl]] -> [PDecl]
forall (t :: * -> *) a. Foldable t => t [a] -> [a]
concat [[PDecl]]
ds)
IdrisParser
(Maybe (Name, FC), Docstring (Either Err PTerm), [PDecl])
-> String
-> IdrisParser
(Maybe (Name, FC), Docstring (Either Err PTerm), [PDecl])
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"interface block"
where
constructor :: IdrisParser (Name, FC)
constructor :: StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
constructor = String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"constructor" StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
annotate :: SyntaxInfo -> IState -> Docstring () -> Docstring (Either Err PTerm)
annotate :: SyntaxInfo
-> IState -> Docstring () -> Docstring (Either Err PTerm)
annotate SyntaxInfo
syn IState
ist = (String -> Either Err PTerm)
-> Docstring () -> Docstring (Either Err PTerm)
forall a b. (String -> b) -> Docstring a -> Docstring b
annotCode ((String -> Either Err PTerm)
-> Docstring () -> Docstring (Either Err PTerm))
-> (String -> Either Err PTerm)
-> Docstring ()
-> Docstring (Either Err PTerm)
forall a b. (a -> b) -> a -> b
$ SyntaxInfo -> IState -> String -> Either Err PTerm
tryFullExpr SyntaxInfo
syn IState
ist
interface_ :: SyntaxInfo -> IdrisParser [PDecl]
interface_ :: SyntaxInfo -> IdrisParser [PDecl]
interface_ SyntaxInfo
syn = do (Docstring (Either Err PTerm)
doc, [(Name, Docstring (Either Err PTerm))]
argDocs, Accessibility
acc)
<- StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], Accessibility)
-> StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], Accessibility)
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (do (Docstring (Either Err PTerm)
doc, [(Name, Docstring (Either Err PTerm))]
argDocs) <- SyntaxInfo
-> IdrisParser
(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))])
docstring SyntaxInfo
syn
Accessibility
acc <- IdrisParser Accessibility
accessibility
StateT IState (WriterT FC (Parsec Void String)) ()
interfaceKeyword
(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], Accessibility)
-> StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))], Accessibility)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Docstring (Either Err PTerm)
doc, [(Name, Docstring (Either Err PTerm))]
argDocs, Accessibility
acc))
(([(Name, PTerm)]
cons', Name
n, FC
nfc, [(Name, FC, PTerm)]
cs, [(Name, FC)]
fds), FC
fc) <- StateT
IState
(WriterT FC (Parsec Void String))
([(Name, PTerm)], Name, FC, [(Name, FC, PTerm)], [(Name, FC)])
-> StateT
IState
(WriterT FC (Parsec Void String))
(([(Name, PTerm)], Name, FC, [(Name, FC, PTerm)], [(Name, FC)]),
FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (StateT
IState
(WriterT FC (Parsec Void String))
([(Name, PTerm)], Name, FC, [(Name, FC, PTerm)], [(Name, FC)])
-> StateT
IState
(WriterT FC (Parsec Void String))
(([(Name, PTerm)], Name, FC, [(Name, FC, PTerm)], [(Name, FC)]),
FC))
-> StateT
IState
(WriterT FC (Parsec Void String))
([(Name, PTerm)], Name, FC, [(Name, FC, PTerm)], [(Name, FC)])
-> StateT
IState
(WriterT FC (Parsec Void String))
(([(Name, PTerm)], Name, FC, [(Name, FC, PTerm)], [(Name, FC)]),
FC)
forall a b. (a -> b) -> a -> b
$ do
[(RigCount, Name, FC, PTerm)]
cons <- SyntaxInfo
-> StateT
IState
(WriterT FC (Parsec Void String))
[(RigCount, Name, FC, PTerm)]
constraintList SyntaxInfo
syn
let cons' :: [(Name, PTerm)]
cons' = [(Name
c, PTerm
ty) | (RigCount
_, Name
c, FC
_, PTerm
ty) <- [(RigCount, Name, FC, PTerm)]
cons]
(Name
n_in, FC
nfc) <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
let n :: Name
n = SyntaxInfo -> Name -> Name
expandNS SyntaxInfo
syn Name
n_in
[(Name, FC, PTerm)]
cs <- StateT IState (WriterT FC (Parsec Void String)) (Name, FC, PTerm)
-> StateT
IState (WriterT FC (Parsec Void String)) [(Name, FC, PTerm)]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many StateT IState (WriterT FC (Parsec Void String)) (Name, FC, PTerm)
carg
[(Name, FC)]
fds <- [(Name, FC)]
-> StateT IState (WriterT FC (Parsec Void String)) [(Name, FC)]
-> StateT IState (WriterT FC (Parsec Void String)) [(Name, FC)]
forall (m :: * -> *) a. Alternative m => a -> m a -> m a
P.option [(Name
cn, FC
NoFC) | (Name
cn, FC
_, PTerm
_) <- [(Name, FC, PTerm)]
cs] StateT IState (WriterT FC (Parsec Void String)) [(Name, FC)]
fundeps
([(Name, PTerm)], Name, FC, [(Name, FC, PTerm)], [(Name, FC)])
-> StateT
IState
(WriterT FC (Parsec Void String))
([(Name, PTerm)], Name, FC, [(Name, FC, PTerm)], [(Name, FC)])
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return ([(Name, PTerm)]
cons', Name
n, FC
nfc, [(Name, FC, PTerm)]
cs, [(Name, FC)]
fds)
(Maybe (Name, FC)
cn, Docstring (Either Err PTerm)
cd, [PDecl]
ds) <- (Maybe (Name, FC), Docstring (Either Err PTerm), [PDecl])
-> IdrisParser
(Maybe (Name, FC), Docstring (Either Err PTerm), [PDecl])
-> IdrisParser
(Maybe (Name, FC), Docstring (Either Err PTerm), [PDecl])
forall (m :: * -> *) a. Alternative m => a -> m a -> m a
P.option (Maybe (Name, FC)
forall a. Maybe a
Nothing, (Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))])
-> Docstring (Either Err PTerm)
forall a b. (a, b) -> a
fst (Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))])
forall a. (Docstring a, [(Name, Docstring a)])
noDocs, []) (SyntaxInfo
-> IdrisParser
(Maybe (Name, FC), Docstring (Either Err PTerm), [PDecl])
interfaceBlock SyntaxInfo
syn)
Accessibility
-> Name
-> [Name]
-> StateT IState (WriterT FC (Parsec Void String)) ()
accData Accessibility
acc Name
n ((PDecl -> [Name]) -> [PDecl] -> [Name]
forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap PDecl -> [Name]
declared [PDecl]
ds)
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Docstring (Either Err PTerm)
-> SyntaxInfo
-> FC
-> [(Name, PTerm)]
-> Name
-> FC
-> [(Name, FC, PTerm)]
-> [(Name, Docstring (Either Err PTerm))]
-> [(Name, FC)]
-> [PDecl]
-> Maybe (Name, FC)
-> Docstring (Either Err PTerm)
-> PDecl
forall t.
Docstring (Either Err t)
-> SyntaxInfo
-> FC
-> [(Name, t)]
-> Name
-> FC
-> [(Name, FC, t)]
-> [(Name, Docstring (Either Err t))]
-> [(Name, FC)]
-> [PDecl' t]
-> Maybe (Name, FC)
-> Docstring (Either Err t)
-> PDecl' t
PInterface Docstring (Either Err PTerm)
doc SyntaxInfo
syn FC
fc [(Name, PTerm)]
cons' Name
n FC
nfc [(Name, FC, PTerm)]
cs [(Name, Docstring (Either Err PTerm))]
argDocs [(Name, FC)]
fds [PDecl]
ds Maybe (Name, FC)
cn Docstring (Either Err PTerm)
cd]
IdrisParser [PDecl] -> String -> IdrisParser [PDecl]
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"interface declaration"
where
fundeps :: IdrisParser [(Name, FC)]
fundeps :: StateT IState (WriterT FC (Parsec Void String)) [(Name, FC)]
fundeps = do Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'|'; StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
-> StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) [(Name, FC)]
forall (m :: * -> *) a sep. MonadPlus m => m a -> m sep -> m [a]
P.sepBy (StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
name) (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
',')
classWarning :: String
classWarning :: String
classWarning = String
"Use of a fragile keyword `class`. " String -> String -> String
forall a. [a] -> [a] -> [a]
++
String
"`class` is provided for those coming from Haskell. " String -> String -> String
forall a. [a] -> [a] -> [a]
++
String
"Please use `interface` instead, which is equivalent."
interfaceKeyword :: IdrisParser ()
interfaceKeyword :: StateT IState (WriterT FC (Parsec Void String)) ()
interfaceKeyword = String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"interface"
StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do FC
fc <- StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall (m :: * -> *) a. MonadWriter FC m => m a -> m FC
extent (StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC)
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall a b. (a -> b) -> a -> b
$ String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"class"
FC
-> Maybe Opt
-> Err
-> StateT IState (WriterT FC (Parsec Void String)) ()
parserWarning FC
fc Maybe Opt
forall a. Maybe a
Nothing (String -> Err
forall t. String -> Err' t
Msg String
classWarning)
carg :: IdrisParser (Name, FC, PTerm)
carg :: StateT IState (WriterT FC (Parsec Void String)) (Name, FC, PTerm)
carg = do Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'('; (Name
i, FC
ifc) <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
name; Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
':'; PTerm
ty <- SyntaxInfo -> IdrisParser PTerm
expr SyntaxInfo
syn; Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
')'
(Name, FC, PTerm)
-> StateT
IState (WriterT FC (Parsec Void String)) (Name, FC, PTerm)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Name
i, FC
ifc, PTerm
ty)
StateT IState (WriterT FC (Parsec Void String)) (Name, FC, PTerm)
-> StateT
IState (WriterT FC (Parsec Void String)) (Name, FC, PTerm)
-> StateT
IState (WriterT FC (Parsec Void String)) (Name, FC, PTerm)
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do (Name
i, FC
ifc) <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
name
(Name, FC, PTerm)
-> StateT
IState (WriterT FC (Parsec Void String)) (Name, FC, PTerm)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Name
i, FC
ifc, FC -> PTerm
PType FC
ifc)
implementation :: SyntaxInfo -> IdrisParser [PDecl]
implementation :: SyntaxInfo -> IdrisParser [PDecl]
implementation SyntaxInfo
syn = do (Docstring (Either Err PTerm)
doc, [(Name, Docstring (Either Err PTerm))]
argDocs) <- SyntaxInfo
-> IdrisParser
(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))])
docstring SyntaxInfo
syn
(FnOpts
opts, Accessibility
acc) <- IdrisParser (FnOpts, Accessibility)
fnOpts
StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) (Maybe ())
forall (f :: * -> *) a. Alternative f => f a -> f (Maybe a)
optional StateT IState (WriterT FC (Parsec Void String)) ()
implementationKeyword
((Maybe Name
en, [(RigCount, Name, FC, PTerm)]
cs, [(Name, PTerm)]
cs', Name
cn, FC
cnfc, [PTerm]
args, [Name]
pnames), FC
fc) <- StateT
IState
(WriterT FC (Parsec Void String))
(Maybe Name, [(RigCount, Name, FC, PTerm)], [(Name, PTerm)], Name,
FC, [PTerm], [Name])
-> StateT
IState
(WriterT FC (Parsec Void String))
((Maybe Name, [(RigCount, Name, FC, PTerm)], [(Name, PTerm)], Name,
FC, [PTerm], [Name]),
FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (StateT
IState
(WriterT FC (Parsec Void String))
(Maybe Name, [(RigCount, Name, FC, PTerm)], [(Name, PTerm)], Name,
FC, [PTerm], [Name])
-> StateT
IState
(WriterT FC (Parsec Void String))
((Maybe Name, [(RigCount, Name, FC, PTerm)], [(Name, PTerm)], Name,
FC, [PTerm], [Name]),
FC))
-> StateT
IState
(WriterT FC (Parsec Void String))
(Maybe Name, [(RigCount, Name, FC, PTerm)], [(Name, PTerm)], Name,
FC, [PTerm], [Name])
-> StateT
IState
(WriterT FC (Parsec Void String))
((Maybe Name, [(RigCount, Name, FC, PTerm)], [(Name, PTerm)], Name,
FC, [PTerm], [Name]),
FC)
forall a b. (a -> b) -> a -> b
$ do
Maybe Name
en <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Maybe Name)
forall (f :: * -> *) a. Alternative f => f a -> f (Maybe a)
optional StateT IState (WriterT FC (Parsec Void String)) Name
implementationName
[(RigCount, Name, FC, PTerm)]
cs <- SyntaxInfo
-> StateT
IState
(WriterT FC (Parsec Void String))
[(RigCount, Name, FC, PTerm)]
constraintList SyntaxInfo
syn
let cs' :: [(Name, PTerm)]
cs' = [(Name
c, PTerm
ty) | (RigCount
_, Name
c, FC
_, PTerm
ty) <- [(RigCount, Name, FC, PTerm)]
cs]
(Name
cn, FC
cnfc) <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
[PTerm]
args <- IdrisParser PTerm
-> StateT IState (WriterT FC (Parsec Void String)) [PTerm]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many (SyntaxInfo -> IdrisParser PTerm
simpleExpr SyntaxInfo
syn)
[Name]
pnames <- IdrisParser [Name]
implementationUsing
(Maybe Name, [(RigCount, Name, FC, PTerm)], [(Name, PTerm)], Name,
FC, [PTerm], [Name])
-> StateT
IState
(WriterT FC (Parsec Void String))
(Maybe Name, [(RigCount, Name, FC, PTerm)], [(Name, PTerm)], Name,
FC, [PTerm], [Name])
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Maybe Name
en, [(RigCount, Name, FC, PTerm)]
cs, [(Name, PTerm)]
cs', Name
cn, FC
cnfc, [PTerm]
args, [Name]
pnames)
let sc :: PTerm
sc = FC -> PTerm -> [PArg] -> PTerm
PApp FC
fc (FC -> [FC] -> Name -> PTerm
PRef FC
cnfc [FC
cnfc] Name
cn) ((PTerm -> PArg) -> [PTerm] -> [PArg]
forall a b. (a -> b) -> [a] -> [b]
map PTerm -> PArg
forall {t}. t -> PArg' t
pexp [PTerm]
args)
let t :: PTerm
t = (RigCount -> Name -> FC -> PTerm -> PTerm -> PTerm)
-> [(RigCount, Name, FC, PTerm)] -> PTerm -> PTerm
bindList (\RigCount
r -> Plicity -> Name -> FC -> PTerm -> PTerm -> PTerm
PPi Plicity
constraint { pcount = r }) [(RigCount, Name, FC, PTerm)]
cs PTerm
sc
[PDecl]
ds <- SyntaxInfo -> IdrisParser [PDecl]
implementationBlock SyntaxInfo
syn
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Docstring (Either Err PTerm)
-> [(Name, Docstring (Either Err PTerm))]
-> SyntaxInfo
-> FC
-> [(Name, PTerm)]
-> [Name]
-> Accessibility
-> FnOpts
-> Name
-> FC
-> [PTerm]
-> [(Name, PTerm)]
-> PTerm
-> Maybe Name
-> [PDecl]
-> PDecl
forall t.
Docstring (Either Err t)
-> [(Name, Docstring (Either Err t))]
-> SyntaxInfo
-> FC
-> [(Name, t)]
-> [Name]
-> Accessibility
-> FnOpts
-> Name
-> FC
-> [t]
-> [(Name, t)]
-> t
-> Maybe Name
-> [PDecl' t]
-> PDecl' t
PImplementation Docstring (Either Err PTerm)
doc [(Name, Docstring (Either Err PTerm))]
argDocs SyntaxInfo
syn FC
fc [(Name, PTerm)]
cs' [Name]
pnames Accessibility
acc FnOpts
opts Name
cn FC
cnfc [PTerm]
args [] PTerm
t Maybe Name
en [PDecl]
ds]
IdrisParser [PDecl] -> String -> IdrisParser [PDecl]
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"implementation declaration"
where implementationName :: IdrisParser Name
implementationName :: StateT IState (WriterT FC (Parsec Void String)) Name
implementationName = do Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'['; Name
n_in <- StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName; Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
']'
let n :: Name
n = SyntaxInfo -> Name -> Name
expandNS SyntaxInfo
syn Name
n_in
Name -> StateT IState (WriterT FC (Parsec Void String)) Name
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return Name
n
StateT IState (WriterT FC (Parsec Void String)) Name
-> String -> StateT IState (WriterT FC (Parsec Void String)) Name
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"implementation name"
instanceWarning :: String
instanceWarning :: String
instanceWarning = String
"Use of fragile keyword `instance`. " String -> String -> String
forall a. [a] -> [a] -> [a]
++
String
"`instance` is provided for those coming from Haskell. " String -> String -> String
forall a. [a] -> [a] -> [a]
++
String
"Please use `implementation` (which is equivalent) instead, or omit it."
implementationKeyword :: IdrisParser ()
implementationKeyword :: StateT IState (WriterT FC (Parsec Void String)) ()
implementationKeyword = String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"implementation"
StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do FC
fc <- StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall (m :: * -> *) a. MonadWriter FC m => m a -> m FC
extent (StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC)
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall a b. (a -> b) -> a -> b
$ String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"instance"
FC
-> Maybe Opt
-> Err
-> StateT IState (WriterT FC (Parsec Void String)) ()
parserWarning FC
fc Maybe Opt
forall a. Maybe a
Nothing (String -> Err
forall t. String -> Err' t
Msg String
instanceWarning)
implementationUsing :: IdrisParser [Name]
implementationUsing :: IdrisParser [Name]
implementationUsing = do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"using"
[(Name, FC)]
ns <- StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
-> StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) [(Name, FC)]
forall (m :: * -> *) a sep. MonadPlus m => m a -> m sep -> m [a]
P.sepBy1 (StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName) (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
',')
[Name] -> IdrisParser [Name]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (((Name, FC) -> Name) -> [(Name, FC)] -> [Name]
forall a b. (a -> b) -> [a] -> [b]
map (Name, FC) -> Name
forall a b. (a, b) -> a
fst [(Name, FC)]
ns)
IdrisParser [Name] -> IdrisParser [Name] -> IdrisParser [Name]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> [Name] -> IdrisParser [Name]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return []
docstring :: SyntaxInfo
-> IdrisParser (Docstring (Either Err PTerm),
[(Name,Docstring (Either Err PTerm))])
docstring :: SyntaxInfo
-> IdrisParser
(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))])
docstring SyntaxInfo
syn = do (Docstring ()
doc, [(Name, Docstring ())]
argDocs) <- (Docstring (), [(Name, Docstring ())])
-> StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (), [(Name, Docstring ())])
-> StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (), [(Name, Docstring ())])
forall (m :: * -> *) a. Alternative m => a -> m a -> m a
P.option (Docstring (), [(Name, Docstring ())])
forall a. (Docstring a, [(Name, Docstring a)])
noDocs StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (), [(Name, Docstring ())])
docComment
IState
ist <- StateT IState (WriterT FC (Parsec Void String)) IState
forall s (m :: * -> *). MonadState s m => m s
get
let doc' :: Docstring (Either Err PTerm)
doc' = (String -> Either Err PTerm)
-> Docstring () -> Docstring (Either Err PTerm)
forall a b. (String -> b) -> Docstring a -> Docstring b
annotCode (SyntaxInfo -> IState -> String -> Either Err PTerm
tryFullExpr SyntaxInfo
syn IState
ist) Docstring ()
doc
argDocs' :: [(Name, Docstring (Either Err PTerm))]
argDocs' = [ (Name
n, (String -> Either Err PTerm)
-> Docstring () -> Docstring (Either Err PTerm)
forall a b. (String -> b) -> Docstring a -> Docstring b
annotCode (SyntaxInfo -> IState -> String -> Either Err PTerm
tryFullExpr SyntaxInfo
syn IState
ist) Docstring ()
d)
| (Name
n, Docstring ()
d) <- [(Name, Docstring ())]
argDocs ]
(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))])
-> IdrisParser
(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))])
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Docstring (Either Err PTerm)
doc', [(Name, Docstring (Either Err PTerm))]
argDocs')
usingDeclList :: SyntaxInfo -> IdrisParser [Using]
usingDeclList :: SyntaxInfo -> IdrisParser [Using]
usingDeclList SyntaxInfo
syn
= IdrisParser [Using] -> IdrisParser [Using]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (StateT IState (WriterT FC (Parsec Void String)) Using
-> StateT IState (WriterT FC (Parsec Void String)) Char
-> IdrisParser [Using]
forall (m :: * -> *) a sep. MonadPlus m => m a -> m sep -> m [a]
P.sepBy1 (SyntaxInfo -> StateT IState (WriterT FC (Parsec Void String)) Using
usingDecl SyntaxInfo
syn) (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
','))
IdrisParser [Using] -> IdrisParser [Using] -> IdrisParser [Using]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do [Name]
ns <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) Char
-> IdrisParser [Name]
forall (m :: * -> *) a sep. MonadPlus m => m a -> m sep -> m [a]
P.sepBy1 StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
name (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
',')
Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
':'
PTerm
t <- SyntaxInfo -> IdrisParser PTerm
typeExpr (SyntaxInfo -> SyntaxInfo
disallowImp SyntaxInfo
syn)
[Using] -> IdrisParser [Using]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return ((Name -> Using) -> [Name] -> [Using]
forall a b. (a -> b) -> [a] -> [b]
map (\Name
x -> Name -> PTerm -> Using
UImplicit Name
x PTerm
t) [Name]
ns)
IdrisParser [Using] -> String -> IdrisParser [Using]
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"using declaration list"
usingDecl :: SyntaxInfo -> IdrisParser Using
usingDecl :: SyntaxInfo -> StateT IState (WriterT FC (Parsec Void String)) Using
usingDecl SyntaxInfo
syn = StateT IState (WriterT FC (Parsec Void String)) Using
-> StateT IState (WriterT FC (Parsec Void String)) Using
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (do Name
x <- StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
':'
PTerm
t <- SyntaxInfo -> IdrisParser PTerm
typeExpr (SyntaxInfo -> SyntaxInfo
disallowImp SyntaxInfo
syn)
Using -> StateT IState (WriterT FC (Parsec Void String)) Using
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Name -> PTerm -> Using
UImplicit Name
x PTerm
t))
StateT IState (WriterT FC (Parsec Void String)) Using
-> StateT IState (WriterT FC (Parsec Void String)) Using
-> StateT IState (WriterT FC (Parsec Void String)) Using
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do Name
c <- StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
[Name]
xs <- StateT IState (WriterT FC (Parsec Void String)) Name
-> IdrisParser [Name]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
Using -> StateT IState (WriterT FC (Parsec Void String)) Using
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Name -> [Name] -> Using
UConstraint Name
c [Name]
xs)
StateT IState (WriterT FC (Parsec Void String)) Using
-> String -> StateT IState (WriterT FC (Parsec Void String)) Using
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"using declaration"
pattern :: SyntaxInfo -> IdrisParser PDecl
pattern :: SyntaxInfo -> IdrisParser PDecl
pattern SyntaxInfo
syn = do (PClause' PTerm
clause, FC
fc) <- StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
-> StateT
IState (WriterT FC (Parsec Void String)) (PClause' PTerm, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (SyntaxInfo
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
clause SyntaxInfo
syn)
PDecl -> IdrisParser PDecl
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (FC -> FnOpts -> Name -> [PClause' PTerm] -> PDecl
forall t. FC -> FnOpts -> Name -> [PClause' t] -> PDecl' t
PClauses FC
fc [] (Int -> String -> Name
sMN Int
2 String
"_") [PClause' PTerm
clause])
IdrisParser PDecl -> String -> IdrisParser PDecl
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"pattern"
caf :: SyntaxInfo -> IdrisParser PDecl
caf :: SyntaxInfo -> IdrisParser PDecl
caf SyntaxInfo
syn = do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"let"
(Name
n, FC
fc) <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (SyntaxInfo -> Name -> Name
expandNS SyntaxInfo
syn (Name -> Name)
-> StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) Name
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName)
StateT IState (WriterT FC (Parsec Void String)) ()
pushIndent
Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'='
PTerm
t <- IdrisParser PTerm -> IdrisParser PTerm
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
indented (IdrisParser PTerm -> IdrisParser PTerm)
-> IdrisParser PTerm -> IdrisParser PTerm
forall a b. (a -> b) -> a -> b
$ SyntaxInfo -> IdrisParser PTerm
expr SyntaxInfo
syn
StateT IState (WriterT FC (Parsec Void String)) ()
terminator
PDecl -> IdrisParser PDecl
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (FC -> Name -> PTerm -> PDecl
forall t. FC -> Name -> t -> PDecl' t
PCAF FC
fc Name
n PTerm
t)
IdrisParser PDecl -> String -> IdrisParser PDecl
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"constant applicative form declaration"
argExpr :: SyntaxInfo -> IdrisParser PTerm
argExpr :: SyntaxInfo -> IdrisParser PTerm
argExpr SyntaxInfo
syn = let syn' :: SyntaxInfo
syn' = SyntaxInfo
syn { inPattern = True } in
IdrisParser PTerm -> IdrisParser PTerm
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (SyntaxInfo -> IdrisParser PTerm
hsimpleExpr SyntaxInfo
syn') IdrisParser PTerm -> IdrisParser PTerm -> IdrisParser PTerm
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> SyntaxInfo -> IdrisParser PTerm
simpleExternalExpr SyntaxInfo
syn'
IdrisParser PTerm -> String -> IdrisParser PTerm
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"argument expression"
rhs :: SyntaxInfo -> Name -> IdrisParser (PTerm, FC)
rhs :: SyntaxInfo -> Name -> IdrisParser (PTerm, FC)
rhs SyntaxInfo
syn Name
n = do Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'='
StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). (Parsing m, MonadState IState m) => m ()
indentGt
IdrisParser PTerm -> IdrisParser (PTerm, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (IdrisParser PTerm -> IdrisParser (PTerm, FC))
-> IdrisParser PTerm -> IdrisParser (PTerm, FC)
forall a b. (a -> b) -> a -> b
$ SyntaxInfo -> IdrisParser PTerm
expr SyntaxInfo
syn
IdrisParser (PTerm, FC)
-> IdrisParser (PTerm, FC) -> IdrisParser (PTerm, FC)
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
symbol String
"?=";
(Name
name, FC
fc) <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC))
-> StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall a b. (a -> b) -> a -> b
$ Name
-> StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *) a. Alternative m => a -> m a -> m a
P.option Name
n' (String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
symbol String
"{" StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) Name
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) Name
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f a
<* String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
symbol String
"}")
PTerm
r <- SyntaxInfo -> IdrisParser PTerm
expr SyntaxInfo
syn
(PTerm, FC) -> IdrisParser (PTerm, FC)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (FC -> Name -> PTerm -> PTerm
addLet FC
fc Name
name PTerm
r, FC
fc)
IdrisParser (PTerm, FC)
-> IdrisParser (PTerm, FC) -> IdrisParser (PTerm, FC)
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> IdrisParser PTerm -> IdrisParser (PTerm, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent IdrisParser PTerm
impossible
IdrisParser (PTerm, FC) -> String -> IdrisParser (PTerm, FC)
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"function right hand side"
where mkN :: Name -> Name
mkN :: Name -> Name
mkN (UN Text
x) = if (Text -> Bool
tnull Text
x Bool -> Bool -> Bool
|| Bool -> Bool
not (Char -> Bool
isAlpha (Text -> Char
thead Text
x)))
then String -> Name
sUN String
"infix_op_lemma_1"
else String -> Name
sUN (Text -> String
str Text
xString -> String -> String
forall a. [a] -> [a] -> [a]
++String
"_lemma_1")
mkN (NS Name
x [Text]
n) = Name -> [Text] -> Name
NS (Name -> Name
mkN Name
x) [Text]
n
n' :: Name
n' :: Name
n' = Name -> Name
mkN Name
n
addLet :: FC -> Name -> PTerm -> PTerm
addLet :: FC -> Name -> PTerm -> PTerm
addLet FC
fc Name
nm (PLet FC
fc' RigCount
rig Name
n FC
nfc PTerm
ty PTerm
val PTerm
r) = FC -> RigCount -> Name -> FC -> PTerm -> PTerm -> PTerm -> PTerm
PLet FC
fc' RigCount
rig Name
n FC
nfc PTerm
ty PTerm
val (FC -> Name -> PTerm -> PTerm
addLet FC
fc Name
nm PTerm
r)
addLet FC
fc Name
nm (PCase FC
fc' PTerm
t [(PTerm, PTerm)]
cs) = FC -> PTerm -> [(PTerm, PTerm)] -> PTerm
PCase FC
fc' PTerm
t (((PTerm, PTerm) -> (PTerm, PTerm))
-> [(PTerm, PTerm)] -> [(PTerm, PTerm)]
forall a b. (a -> b) -> [a] -> [b]
map (PTerm, PTerm) -> (PTerm, PTerm)
forall {a}. (a, PTerm) -> (a, PTerm)
addLetC [(PTerm, PTerm)]
cs)
where addLetC :: (a, PTerm) -> (a, PTerm)
addLetC (a
l, PTerm
r) = (a
l, FC -> Name -> PTerm -> PTerm
addLet FC
fc Name
nm PTerm
r)
addLet FC
fc Name
nm PTerm
r = (FC -> RigCount -> Name -> FC -> PTerm -> PTerm -> PTerm -> PTerm
PLet FC
fc RigCount
RigW (String -> Name
sUN String
"value") FC
NoFC PTerm
Placeholder PTerm
r (FC -> Name -> PTerm
PMetavar FC
NoFC Name
nm))
clause :: SyntaxInfo -> IdrisParser PClause
clause :: SyntaxInfo
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
clause SyntaxInfo
syn
= do [PTerm]
wargs <- StateT IState (WriterT FC (Parsec Void String)) [PTerm]
-> StateT IState (WriterT FC (Parsec Void String)) [PTerm]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (do StateT IState (WriterT FC (Parsec Void String)) ()
pushIndent; IdrisParser PTerm
-> StateT IState (WriterT FC (Parsec Void String)) [PTerm]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
some (SyntaxInfo -> IdrisParser PTerm
wExpr SyntaxInfo
syn))
IState
ist <- StateT IState (WriterT FC (Parsec Void String)) IState
forall s (m :: * -> *). MonadState s m => m s
get
Name
n <- case IState -> Maybe Name
lastParse IState
ist of
Just Name
t -> Name -> StateT IState (WriterT FC (Parsec Void String)) Name
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return Name
t
Maybe Name
Nothing -> String -> StateT IState (WriterT FC (Parsec Void String)) Name
forall a.
String -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. MonadFail m => String -> m a
fail String
"Invalid clause"
(do (PTerm
r, FC
fc) <- SyntaxInfo -> Name -> IdrisParser (PTerm, FC)
rhs SyntaxInfo
syn Name
n
let wsyn :: SyntaxInfo
wsyn = SyntaxInfo
syn { syn_namespace = [], syn_toplevel = False }
([PDecl]
wheres, [(Name, Name)]
nmap) <- Name -> SyntaxInfo -> IdrisParser ([PDecl], [(Name, Name)])
whereBlock Name
n SyntaxInfo
wsyn IdrisParser ([PDecl], [(Name, Name)])
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> IdrisParser ([PDecl], [(Name, Name)])
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f a
<* StateT IState (WriterT FC (Parsec Void String)) ()
popIndent
IdrisParser ([PDecl], [(Name, Name)])
-> IdrisParser ([PDecl], [(Name, Name)])
-> IdrisParser ([PDecl], [(Name, Name)])
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> ([], []) ([PDecl], [(Name, Name)])
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> IdrisParser ([PDecl], [(Name, Name)])
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ StateT IState (WriterT FC (Parsec Void String)) ()
terminator
PClause' PTerm
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (PClause' PTerm
-> StateT
IState (WriterT FC (Parsec Void String)) (PClause' PTerm))
-> PClause' PTerm
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
forall a b. (a -> b) -> a -> b
$ FC -> [PTerm] -> PTerm -> [PDecl] -> PClause' PTerm
forall t. FC -> [t] -> t -> [PDecl' t] -> PClause' t
PClauseR FC
fc [PTerm]
wargs PTerm
r [PDecl]
wheres) StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (do
StateT IState (WriterT FC (Parsec Void String)) ()
popIndent
((PTerm
wval, Maybe (Name, FC)
pn), FC
fc) <- StateT
IState (WriterT FC (Parsec Void String)) (PTerm, Maybe (Name, FC))
-> StateT
IState
(WriterT FC (Parsec Void String))
((PTerm, Maybe (Name, FC)), FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (StateT
IState (WriterT FC (Parsec Void String)) (PTerm, Maybe (Name, FC))
-> StateT
IState
(WriterT FC (Parsec Void String))
((PTerm, Maybe (Name, FC)), FC))
-> StateT
IState (WriterT FC (Parsec Void String)) (PTerm, Maybe (Name, FC))
-> StateT
IState
(WriterT FC (Parsec Void String))
((PTerm, Maybe (Name, FC)), FC)
forall a b. (a -> b) -> a -> b
$ do
String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"with"
PTerm
wval <- SyntaxInfo -> IdrisParser PTerm
bracketed SyntaxInfo
syn
Maybe (Name, FC)
pn <- StateT IState (WriterT FC (Parsec Void String)) (Maybe (Name, FC))
optProof
(PTerm, Maybe (Name, FC))
-> StateT
IState (WriterT FC (Parsec Void String)) (PTerm, Maybe (Name, FC))
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (PTerm
wval, Maybe (Name, FC)
pn)
StateT IState (WriterT FC (Parsec Void String)) ()
openBlock
[[PDecl]]
ds <- IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
some (IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]])
-> IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]]
forall a b. (a -> b) -> a -> b
$ SyntaxInfo -> IdrisParser [PDecl]
fnDecl SyntaxInfo
syn
let withs :: [PDecl]
withs = [[PDecl]] -> [PDecl]
forall (t :: * -> *) a. Foldable t => t [a] -> [a]
concat [[PDecl]]
ds
StateT IState (WriterT FC (Parsec Void String)) ()
closeBlock
PClause' PTerm
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (PClause' PTerm
-> StateT
IState (WriterT FC (Parsec Void String)) (PClause' PTerm))
-> PClause' PTerm
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
forall a b. (a -> b) -> a -> b
$ FC
-> [PTerm]
-> PTerm
-> Maybe (Name, FC)
-> [PDecl]
-> PClause' PTerm
forall t.
FC -> [t] -> t -> Maybe (Name, FC) -> [PDecl' t] -> PClause' t
PWithR FC
fc [PTerm]
wargs PTerm
wval Maybe (Name, FC)
pn [PDecl]
withs)
StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do PTerm
ty <- IdrisParser PTerm -> IdrisParser PTerm
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (do StateT IState (WriterT FC (Parsec Void String)) ()
pushIndent
PTerm
ty <- SyntaxInfo -> IdrisParser PTerm
simpleExpr SyntaxInfo
syn
String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
symbol String
"<=="
PTerm -> IdrisParser PTerm
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return PTerm
ty)
(Name
n, FC
fc) <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (SyntaxInfo -> Name -> Name
expandNS SyntaxInfo
syn (Name -> Name)
-> StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) Name
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName)
(PTerm
r, FC
_) <- SyntaxInfo -> Name -> IdrisParser (PTerm, FC)
rhs SyntaxInfo
syn Name
n
let wsyn :: SyntaxInfo
wsyn = SyntaxInfo
syn { syn_namespace = [] }
([PDecl]
wheres, [(Name, Name)]
nmap) <- Name -> SyntaxInfo -> IdrisParser ([PDecl], [(Name, Name)])
whereBlock Name
n SyntaxInfo
wsyn IdrisParser ([PDecl], [(Name, Name)])
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> IdrisParser ([PDecl], [(Name, Name)])
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f a
<* StateT IState (WriterT FC (Parsec Void String)) ()
popIndent
IdrisParser ([PDecl], [(Name, Name)])
-> IdrisParser ([PDecl], [(Name, Name)])
-> IdrisParser ([PDecl], [(Name, Name)])
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> ([], []) ([PDecl], [(Name, Name)])
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> IdrisParser ([PDecl], [(Name, Name)])
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ StateT IState (WriterT FC (Parsec Void String)) ()
terminator
let capp :: PTerm
capp = FC -> RigCount -> Name -> FC -> PTerm -> PTerm -> PTerm -> PTerm
PLet FC
fc RigCount
RigW (Int -> String -> Name
sMN Int
0 String
"match") FC
NoFC
PTerm
ty
(FC -> Name -> PTerm
PMatchApp FC
fc Name
n)
(FC -> [FC] -> Name -> PTerm
PRef FC
fc [] (Int -> String -> Name
sMN Int
0 String
"match"))
IState
ist <- StateT IState (WriterT FC (Parsec Void String)) IState
forall s (m :: * -> *). MonadState s m => m s
get
IState -> StateT IState (WriterT FC (Parsec Void String)) ()
forall s (m :: * -> *). MonadState s m => s -> m ()
put (IState
ist { lastParse = Just n })
PClause' PTerm
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (PClause' PTerm
-> StateT
IState (WriterT FC (Parsec Void String)) (PClause' PTerm))
-> PClause' PTerm
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
forall a b. (a -> b) -> a -> b
$ FC
-> Name -> PTerm -> [PTerm] -> PTerm -> [PDecl] -> PClause' PTerm
forall t. FC -> Name -> t -> [t] -> t -> [PDecl' t] -> PClause' t
PClause FC
fc Name
n PTerm
capp [] PTerm
r [PDecl]
wheres
StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
pushIndent
(Name
n, FC
nfc, PTerm
capp, [PTerm]
wargs) <- IdrisParser (Name, FC, PTerm, [PTerm])
lhs
(IState -> IState)
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall s (m :: * -> *). MonadState s m => (s -> s) -> m ()
modify ((IState -> IState)
-> StateT IState (WriterT FC (Parsec Void String)) ())
-> (IState -> IState)
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b. (a -> b) -> a -> b
$ \IState
ist -> IState
ist { lastParse = Just n }
(do (PTerm
rs, FC
fc) <- SyntaxInfo -> Name -> IdrisParser (PTerm, FC)
rhs SyntaxInfo
syn Name
n
let wsyn :: SyntaxInfo
wsyn = SyntaxInfo
syn { syn_namespace = [] }
([PDecl]
wheres, [(Name, Name)]
nmap) <- Name -> SyntaxInfo -> IdrisParser ([PDecl], [(Name, Name)])
whereBlock Name
n SyntaxInfo
wsyn IdrisParser ([PDecl], [(Name, Name)])
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> IdrisParser ([PDecl], [(Name, Name)])
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f a
<* StateT IState (WriterT FC (Parsec Void String)) ()
popIndent
IdrisParser ([PDecl], [(Name, Name)])
-> IdrisParser ([PDecl], [(Name, Name)])
-> IdrisParser ([PDecl], [(Name, Name)])
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> ([], []) ([PDecl], [(Name, Name)])
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> IdrisParser ([PDecl], [(Name, Name)])
forall a b.
a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ StateT IState (WriterT FC (Parsec Void String)) ()
terminator
PClause' PTerm
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (PClause' PTerm
-> StateT
IState (WriterT FC (Parsec Void String)) (PClause' PTerm))
-> PClause' PTerm
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
forall a b. (a -> b) -> a -> b
$ FC
-> Name -> PTerm -> [PTerm] -> PTerm -> [PDecl] -> PClause' PTerm
forall t. FC -> Name -> t -> [t] -> t -> [PDecl' t] -> PClause' t
PClause FC
fc Name
n PTerm
capp [PTerm]
wargs PTerm
rs [PDecl]
wheres) StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (do
StateT IState (WriterT FC (Parsec Void String)) ()
popIndent
((PTerm
wval, Maybe (Name, FC)
pn), FC
fc) <- StateT
IState (WriterT FC (Parsec Void String)) (PTerm, Maybe (Name, FC))
-> StateT
IState
(WriterT FC (Parsec Void String))
((PTerm, Maybe (Name, FC)), FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (StateT
IState (WriterT FC (Parsec Void String)) (PTerm, Maybe (Name, FC))
-> StateT
IState
(WriterT FC (Parsec Void String))
((PTerm, Maybe (Name, FC)), FC))
-> StateT
IState (WriterT FC (Parsec Void String)) (PTerm, Maybe (Name, FC))
-> StateT
IState
(WriterT FC (Parsec Void String))
((PTerm, Maybe (Name, FC)), FC)
forall a b. (a -> b) -> a -> b
$ do
String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"with"
PTerm
wval <- SyntaxInfo -> IdrisParser PTerm
bracketed SyntaxInfo
syn
Maybe (Name, FC)
pn <- StateT IState (WriterT FC (Parsec Void String)) (Maybe (Name, FC))
optProof
(PTerm, Maybe (Name, FC))
-> StateT
IState (WriterT FC (Parsec Void String)) (PTerm, Maybe (Name, FC))
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (PTerm
wval, Maybe (Name, FC)
pn)
StateT IState (WriterT FC (Parsec Void String)) ()
openBlock
[[PDecl]]
ds <- IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
some (IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]])
-> IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]]
forall a b. (a -> b) -> a -> b
$ SyntaxInfo -> IdrisParser [PDecl]
fnDecl SyntaxInfo
syn
StateT IState (WriterT FC (Parsec Void String)) ()
closeBlock
let withs :: [PDecl]
withs = (PDecl -> PDecl) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> [a] -> [b]
map (Name -> PTerm -> [PTerm] -> PDecl -> PDecl
fillLHSD Name
n PTerm
capp [PTerm]
wargs) ([PDecl] -> [PDecl]) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> a -> b
$ [[PDecl]] -> [PDecl]
forall (t :: * -> *) a. Foldable t => t [a] -> [a]
concat [[PDecl]]
ds
PClause' PTerm
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (PClause' PTerm
-> StateT
IState (WriterT FC (Parsec Void String)) (PClause' PTerm))
-> PClause' PTerm
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
forall a b. (a -> b) -> a -> b
$ FC
-> Name
-> PTerm
-> [PTerm]
-> PTerm
-> Maybe (Name, FC)
-> [PDecl]
-> PClause' PTerm
forall t.
FC
-> Name
-> t
-> [t]
-> t
-> Maybe (Name, FC)
-> [PDecl' t]
-> PClause' t
PWith FC
fc Name
n PTerm
capp [PTerm]
wargs PTerm
wval Maybe (Name, FC)
pn [PDecl]
withs)
StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
-> String
-> StateT IState (WriterT FC (Parsec Void String)) (PClause' PTerm)
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"function clause"
where
lhsInfixApp :: IdrisParser (Name, FC, [PArg], [PTerm])
lhsInfixApp :: IdrisParser (Name, FC, [PArg], [PTerm])
lhsInfixApp = do PTerm
l <- SyntaxInfo -> IdrisParser PTerm
argExpr SyntaxInfo
syn
(String
op, FC
nfc) <- StateT IState (WriterT FC (Parsec Void String)) String
-> StateT IState (WriterT FC (Parsec Void String)) (String, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) String
forall (m :: * -> *). Parsing m => m String
symbolicOperator
Bool
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (String
op String -> String -> Bool
forall a. Eq a => a -> a -> Bool
== String
"=" Bool -> Bool -> Bool
|| String
op String -> String -> Bool
forall a. Eq a => a -> a -> Bool
== String
"?=" ) (StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ())
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b. (a -> b) -> a -> b
$
String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
String -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. MonadFail m => String -> m a
fail String
"infix clause definition with \"=\" and \"?=\" not supported "
let n :: Name
n = SyntaxInfo -> Name -> Name
expandNS SyntaxInfo
syn (String -> Name
sUN String
op)
PTerm
r <- SyntaxInfo -> IdrisParser PTerm
argExpr SyntaxInfo
syn
[PTerm]
wargs <- IdrisParser PTerm
-> StateT IState (WriterT FC (Parsec Void String)) [PTerm]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many (SyntaxInfo -> IdrisParser PTerm
wExpr SyntaxInfo
syn)
(Name, FC, [PArg], [PTerm])
-> IdrisParser (Name, FC, [PArg], [PTerm])
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Name
n, FC
nfc, [PTerm -> PArg
forall {t}. t -> PArg' t
pexp PTerm
l, PTerm -> PArg
forall {t}. t -> PArg' t
pexp PTerm
r], [PTerm]
wargs)
lhsPrefixApp :: IdrisParser (Name, FC, [PArg], [PTerm])
lhsPrefixApp :: IdrisParser (Name, FC, [PArg], [PTerm])
lhsPrefixApp = do (Name
n, FC
nfc) <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (SyntaxInfo -> Name -> Name
expandNS SyntaxInfo
syn (Name -> Name)
-> StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) Name
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName)
[PArg]
args <- StateT IState (WriterT FC (Parsec Void String)) PArg
-> StateT IState (WriterT FC (Parsec Void String)) [PArg]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many (StateT IState (WriterT FC (Parsec Void String)) PArg
-> StateT IState (WriterT FC (Parsec Void String)) PArg
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (SyntaxInfo -> StateT IState (WriterT FC (Parsec Void String)) PArg
implicitArg (SyntaxInfo
syn { inPattern = True } ))
StateT IState (WriterT FC (Parsec Void String)) PArg
-> StateT IState (WriterT FC (Parsec Void String)) PArg
-> StateT IState (WriterT FC (Parsec Void String)) PArg
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> StateT IState (WriterT FC (Parsec Void String)) PArg
-> StateT IState (WriterT FC (Parsec Void String)) PArg
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (SyntaxInfo -> StateT IState (WriterT FC (Parsec Void String)) PArg
constraintArg (SyntaxInfo
syn { inPattern = True }))
StateT IState (WriterT FC (Parsec Void String)) PArg
-> StateT IState (WriterT FC (Parsec Void String)) PArg
-> StateT IState (WriterT FC (Parsec Void String)) PArg
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> ((PTerm -> PArg)
-> IdrisParser PTerm
-> StateT IState (WriterT FC (Parsec Void String)) PArg
forall a b.
(a -> b)
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap PTerm -> PArg
forall {t}. t -> PArg' t
pexp (SyntaxInfo -> IdrisParser PTerm
argExpr SyntaxInfo
syn)))
[PTerm]
wargs <- IdrisParser PTerm
-> StateT IState (WriterT FC (Parsec Void String)) [PTerm]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many (SyntaxInfo -> IdrisParser PTerm
wExpr SyntaxInfo
syn)
(Name, FC, [PArg], [PTerm])
-> IdrisParser (Name, FC, [PArg], [PTerm])
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Name
n, FC
nfc, [PArg]
args, [PTerm]
wargs)
lhs :: IdrisParser (Name, FC, PTerm, [PTerm])
lhs :: IdrisParser (Name, FC, PTerm, [PTerm])
lhs = do ((Name
n, FC
nfc, [PArg]
args, [PTerm]
wargs), FC
lhs_fc) <- IdrisParser (Name, FC, [PArg], [PTerm])
-> StateT
IState
(WriterT FC (Parsec Void String))
((Name, FC, [PArg], [PTerm]), FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (IdrisParser (Name, FC, [PArg], [PTerm])
-> IdrisParser (Name, FC, [PArg], [PTerm])
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try IdrisParser (Name, FC, [PArg], [PTerm])
lhsInfixApp IdrisParser (Name, FC, [PArg], [PTerm])
-> IdrisParser (Name, FC, [PArg], [PTerm])
-> IdrisParser (Name, FC, [PArg], [PTerm])
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> IdrisParser (Name, FC, [PArg], [PTerm])
lhsPrefixApp)
let capp :: PTerm
capp = FC -> PTerm -> [PArg] -> PTerm
PApp FC
lhs_fc (FC -> [FC] -> Name -> PTerm
PRef FC
nfc [FC
nfc] Name
n) [PArg]
args
(Name, FC, PTerm, [PTerm])
-> IdrisParser (Name, FC, PTerm, [PTerm])
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Name
n, FC
nfc, PTerm
capp, [PTerm]
wargs)
optProof :: StateT IState (WriterT FC (Parsec Void String)) (Maybe (Name, FC))
optProof = Maybe (Name, FC)
-> StateT
IState (WriterT FC (Parsec Void String)) (Maybe (Name, FC))
-> StateT
IState (WriterT FC (Parsec Void String)) (Maybe (Name, FC))
forall (m :: * -> *) a. Alternative m => a -> m a -> m a
P.option Maybe (Name, FC)
forall a. Maybe a
Nothing (do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"proof"
(Name, FC)
n <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
Maybe (Name, FC)
-> StateT
IState (WriterT FC (Parsec Void String)) (Maybe (Name, FC))
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return ((Name, FC) -> Maybe (Name, FC)
forall a. a -> Maybe a
Just (Name, FC)
n))
fillLHS :: Name -> PTerm -> [PTerm] -> PClause -> PClause
fillLHS :: Name -> PTerm -> [PTerm] -> PClause' PTerm -> PClause' PTerm
fillLHS Name
n PTerm
capp [PTerm]
owargs (PClauseR FC
fc [PTerm]
wargs PTerm
v [PDecl]
ws)
= FC
-> Name -> PTerm -> [PTerm] -> PTerm -> [PDecl] -> PClause' PTerm
forall t. FC -> Name -> t -> [t] -> t -> [PDecl' t] -> PClause' t
PClause FC
fc Name
n PTerm
capp ([PTerm]
owargs [PTerm] -> [PTerm] -> [PTerm]
forall a. [a] -> [a] -> [a]
++ [PTerm]
wargs) PTerm
v [PDecl]
ws
fillLHS Name
n PTerm
capp [PTerm]
owargs (PWithR FC
fc [PTerm]
wargs PTerm
v Maybe (Name, FC)
pn [PDecl]
ws)
= FC
-> Name
-> PTerm
-> [PTerm]
-> PTerm
-> Maybe (Name, FC)
-> [PDecl]
-> PClause' PTerm
forall t.
FC
-> Name
-> t
-> [t]
-> t
-> Maybe (Name, FC)
-> [PDecl' t]
-> PClause' t
PWith FC
fc Name
n PTerm
capp ([PTerm]
owargs [PTerm] -> [PTerm] -> [PTerm]
forall a. [a] -> [a] -> [a]
++ [PTerm]
wargs) PTerm
v Maybe (Name, FC)
pn
((PDecl -> PDecl) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> [a] -> [b]
map (Name -> PTerm -> [PTerm] -> PDecl -> PDecl
fillLHSD Name
n PTerm
capp ([PTerm]
owargs [PTerm] -> [PTerm] -> [PTerm]
forall a. [a] -> [a] -> [a]
++ [PTerm]
wargs)) [PDecl]
ws)
fillLHS Name
_ PTerm
_ [PTerm]
_ PClause' PTerm
c = PClause' PTerm
c
fillLHSD :: Name -> PTerm -> [PTerm] -> PDecl -> PDecl
fillLHSD :: Name -> PTerm -> [PTerm] -> PDecl -> PDecl
fillLHSD Name
n PTerm
c [PTerm]
a (PClauses FC
fc FnOpts
o Name
fn [PClause' PTerm]
cs) = FC -> FnOpts -> Name -> [PClause' PTerm] -> PDecl
forall t. FC -> FnOpts -> Name -> [PClause' t] -> PDecl' t
PClauses FC
fc FnOpts
o Name
fn ((PClause' PTerm -> PClause' PTerm)
-> [PClause' PTerm] -> [PClause' PTerm]
forall a b. (a -> b) -> [a] -> [b]
map (Name -> PTerm -> [PTerm] -> PClause' PTerm -> PClause' PTerm
fillLHS Name
n PTerm
c [PTerm]
a) [PClause' PTerm]
cs)
fillLHSD Name
n PTerm
c [PTerm]
a PDecl
x = PDecl
x
wExpr :: SyntaxInfo -> IdrisParser PTerm
wExpr :: SyntaxInfo -> IdrisParser PTerm
wExpr SyntaxInfo
syn = do Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'|'
SyntaxInfo -> IdrisParser PTerm
expr' (SyntaxInfo
syn { inPattern = True })
IdrisParser PTerm -> String -> IdrisParser PTerm
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"with pattern"
whereBlock :: Name -> SyntaxInfo -> IdrisParser ([PDecl], [(Name, Name)])
whereBlock :: Name -> SyntaxInfo -> IdrisParser ([PDecl], [(Name, Name)])
whereBlock Name
n SyntaxInfo
syn
= do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"where"
[[PDecl]]
ds <- IdrisParser [PDecl]
-> StateT IState (WriterT FC (Parsec Void String)) [[PDecl]]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
indentedBlock1 (SyntaxInfo -> IdrisParser [PDecl]
decl SyntaxInfo
syn)
let dns :: [Name]
dns = ([PDecl] -> [Name]) -> [[PDecl]] -> [Name]
forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap ((PDecl -> [Name]) -> [PDecl] -> [Name]
forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap PDecl -> [Name]
declared) [[PDecl]]
ds
([PDecl], [(Name, Name)]) -> IdrisParser ([PDecl], [(Name, Name)])
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return ([[PDecl]] -> [PDecl]
forall (t :: * -> *) a. Foldable t => t [a] -> [a]
concat [[PDecl]]
ds, (Name -> (Name, Name)) -> [Name] -> [(Name, Name)]
forall a b. (a -> b) -> [a] -> [b]
map (\Name
x -> (Name
x, SyntaxInfo -> Name -> Name
decoration SyntaxInfo
syn Name
x)) [Name]
dns)
IdrisParser ([PDecl], [(Name, Name)])
-> String -> IdrisParser ([PDecl], [(Name, Name)])
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"where block"
codegen_ :: IdrisParser Codegen
codegen_ :: IdrisParser Codegen
codegen_ = do String
n <- StateT IState (WriterT FC (Parsec Void String)) String
forall (m :: * -> *). Parsing m => m String
identifier
Codegen -> IdrisParser Codegen
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (IRFormat -> String -> Codegen
Via IRFormat
IBCFormat ((Char -> Char) -> String -> String
forall a b. (a -> b) -> [a] -> [b]
map Char -> Char
toLower String
n))
IdrisParser Codegen -> IdrisParser Codegen -> IdrisParser Codegen
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"Bytecode"; Codegen -> IdrisParser Codegen
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return Codegen
Bytecode
IdrisParser Codegen -> String -> IdrisParser Codegen
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"code generation language"
directive :: SyntaxInfo -> IdrisParser [PDecl]
directive :: SyntaxInfo -> IdrisParser [PDecl]
directive SyntaxInfo
syn = do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"lib")
Codegen
cgn <- IdrisParser Codegen
codegen_
String
lib <- StateT IState (WriterT FC (Parsec Void String)) String
forall (m :: * -> *). Parsing m => m String
stringLiteral
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (Codegen -> String -> Directive
DLib Codegen
cgn String
lib)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"link")
Codegen
cgn <- IdrisParser Codegen
codegen_; String
obj <- StateT IState (WriterT FC (Parsec Void String)) String
forall (m :: * -> *). Parsing m => m String
stringLiteral
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (Codegen -> String -> Directive
DLink Codegen
cgn String
obj)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"flag")
Codegen
cgn <- IdrisParser Codegen
codegen_; String
flag <- StateT IState (WriterT FC (Parsec Void String)) String
forall (m :: * -> *). Parsing m => m String
stringLiteral
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (Codegen -> String -> Directive
DFlag Codegen
cgn String
flag)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"include")
Codegen
cgn <- IdrisParser Codegen
codegen_
String
hdr <- StateT IState (WriterT FC (Parsec Void String)) String
forall (m :: * -> *). Parsing m => m String
stringLiteral
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (Codegen -> String -> Directive
DInclude Codegen
cgn String
hdr)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"hide"); Name
n <- StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (Name -> Directive
DHide Name
n)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"freeze"); Name
n <- [String] -> StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). Parsing m => [String] -> m Name
iName []
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (Name -> Directive
DFreeze Name
n)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"thaw"); Name
n <- [String] -> StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). Parsing m => [String] -> m Name
iName []
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (Name -> Directive
DThaw Name
n)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"assert_injective"); Name
n <- StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (Name -> Directive
DInjective Name
n)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"access")
Accessibility
acc <- IdrisParser Accessibility
accessibility
IState
ist <- StateT IState (WriterT FC (Parsec Void String)) IState
forall s (m :: * -> *). MonadState s m => m s
get
IState -> StateT IState (WriterT FC (Parsec Void String)) ()
forall s (m :: * -> *). MonadState s m => s -> m ()
put IState
ist { default_access = acc }
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (Accessibility -> Directive
DAccess Accessibility
acc)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"default"); DefaultTotality
tot <- IdrisParser DefaultTotality
totality
IState
i <- StateT IState (WriterT FC (Parsec Void String)) IState
forall s (m :: * -> *). MonadState s m => m s
get
IState -> StateT IState (WriterT FC (Parsec Void String)) ()
forall s (m :: * -> *). MonadState s m => s -> m ()
put (IState
i { default_total = tot } )
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (DefaultTotality -> Directive
DDefault DefaultTotality
tot)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"logging")
Integer
i <- StateT IState (WriterT FC (Parsec Void String)) Integer
forall (m :: * -> *). Parsing m => m Integer
natural
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (Integer -> Directive
DLogging Integer
i)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"dynamic")
[String]
libs <- StateT IState (WriterT FC (Parsec Void String)) String
-> StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) [String]
forall (m :: * -> *) a sep. MonadPlus m => m a -> m sep -> m [a]
P.sepBy1 StateT IState (WriterT FC (Parsec Void String)) String
forall (m :: * -> *). Parsing m => m String
stringLiteral (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
',')
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective ([String] -> Directive
DDynamicLibs [String]
libs)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"name")
(Name
ty, FC
tyFC) <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
[(Name, FC)]
ns <- StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
-> StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) [(Name, FC)]
forall (m :: * -> *) a sep. MonadPlus m => m a -> m sep -> m [a]
P.sepBy1 (StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
name) (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
',')
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (Name -> FC -> [(Name, FC)] -> Directive
DNameHint Name
ty FC
tyFC [(Name, FC)]
ns)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"error_handlers")
(Name
fn, FC
nfc) <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
(Name
arg, FC
afc) <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
[(Name, FC)]
ns <- StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
-> StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) [(Name, FC)]
forall (m :: * -> *) a sep. MonadPlus m => m a -> m sep -> m [a]
P.sepBy1 (StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
name) (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
',')
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (Name -> FC -> Name -> FC -> [(Name, FC)] -> Directive
DErrorHandlers Name
fn FC
nfc Name
arg FC
afc [(Name, FC)]
ns) ]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"language"); LanguageExt
ext <- IdrisParser LanguageExt
pLangExt;
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (LanguageExt -> Directive
DLanguage LanguageExt
ext)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"deprecate")
Name
n <- StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
String
alt <- String
-> StateT IState (WriterT FC (Parsec Void String)) String
-> StateT IState (WriterT FC (Parsec Void String)) String
forall (m :: * -> *) a. Alternative m => a -> m a -> m a
P.option String
"" StateT IState (WriterT FC (Parsec Void String)) String
forall (m :: * -> *). Parsing m => m String
stringLiteral
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (Name -> String -> Directive
DDeprecate Name
n String
alt)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"fragile")
Name
n <- StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
String
alt <- String
-> StateT IState (WriterT FC (Parsec Void String)) String
-> StateT IState (WriterT FC (Parsec Void String)) String
forall (m :: * -> *) a. Alternative m => a -> m a -> m a
P.option String
"" StateT IState (WriterT FC (Parsec Void String)) String
forall (m :: * -> *). Parsing m => m String
stringLiteral
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (Name -> String -> Directive
DFragile Name
n String
alt)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do FC
fc <- StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall (m :: * -> *) a. MonadWriter FC m => m a -> m FC
extent (StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC)
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall a b. (a -> b) -> a -> b
$ StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"used")
Name
fn <- StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
Name
arg <- [String] -> StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). Parsing m => [String] -> m Name
iName []
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (FC -> Name -> Name -> Directive
DUsed FC
fc Name
fn Name
arg)]
IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"auto_implicits")
Bool
b <- StateT IState (WriterT FC (Parsec Void String)) Bool
on_off
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Directive -> PDecl
forall t. Directive -> PDecl' t
PDirective (Bool -> Directive
DAutoImplicits Bool
b)]
IdrisParser [PDecl] -> String -> IdrisParser [PDecl]
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"directive"
where on_off :: StateT IState (WriterT FC (Parsec Void String)) Bool
on_off = do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"on"; Bool -> StateT IState (WriterT FC (Parsec Void String)) Bool
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
True
StateT IState (WriterT FC (Parsec Void String)) Bool
-> StateT IState (WriterT FC (Parsec Void String)) Bool
-> StateT IState (WriterT FC (Parsec Void String)) Bool
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"off"; Bool -> StateT IState (WriterT FC (Parsec Void String)) Bool
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
False
pLangExt :: IdrisParser LanguageExt
pLangExt :: IdrisParser LanguageExt
pLangExt = (String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"TypeProviders" StateT IState (WriterT FC (Parsec Void String)) ()
-> IdrisParser LanguageExt -> IdrisParser LanguageExt
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> LanguageExt -> IdrisParser LanguageExt
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return LanguageExt
TypeProviders)
IdrisParser LanguageExt
-> IdrisParser LanguageExt -> IdrisParser LanguageExt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"ErrorReflection" StateT IState (WriterT FC (Parsec Void String)) ()
-> IdrisParser LanguageExt -> IdrisParser LanguageExt
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> LanguageExt -> IdrisParser LanguageExt
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return LanguageExt
ErrorReflection)
IdrisParser LanguageExt
-> IdrisParser LanguageExt -> IdrisParser LanguageExt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"UniquenessTypes" StateT IState (WriterT FC (Parsec Void String)) ()
-> IdrisParser LanguageExt -> IdrisParser LanguageExt
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> LanguageExt -> IdrisParser LanguageExt
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return LanguageExt
UniquenessTypes)
IdrisParser LanguageExt
-> IdrisParser LanguageExt -> IdrisParser LanguageExt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"LinearTypes" StateT IState (WriterT FC (Parsec Void String)) ()
-> IdrisParser LanguageExt -> IdrisParser LanguageExt
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> LanguageExt -> IdrisParser LanguageExt
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return LanguageExt
LinearTypes)
IdrisParser LanguageExt
-> IdrisParser LanguageExt -> IdrisParser LanguageExt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"DSLNotation" StateT IState (WriterT FC (Parsec Void String)) ()
-> IdrisParser LanguageExt -> IdrisParser LanguageExt
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> LanguageExt -> IdrisParser LanguageExt
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return LanguageExt
DSLNotation)
IdrisParser LanguageExt
-> IdrisParser LanguageExt -> IdrisParser LanguageExt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"ElabReflection" StateT IState (WriterT FC (Parsec Void String)) ()
-> IdrisParser LanguageExt -> IdrisParser LanguageExt
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> LanguageExt -> IdrisParser LanguageExt
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return LanguageExt
ElabReflection)
IdrisParser LanguageExt
-> IdrisParser LanguageExt -> IdrisParser LanguageExt
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"FirstClassReflection" StateT IState (WriterT FC (Parsec Void String)) ()
-> IdrisParser LanguageExt -> IdrisParser LanguageExt
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> LanguageExt -> IdrisParser LanguageExt
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return LanguageExt
FCReflection)
totality :: IdrisParser DefaultTotality
totality :: IdrisParser DefaultTotality
totality
= do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"total"; DefaultTotality -> IdrisParser DefaultTotality
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return DefaultTotality
DefaultCheckingTotal
IdrisParser DefaultTotality
-> IdrisParser DefaultTotality -> IdrisParser DefaultTotality
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"partial"; DefaultTotality -> IdrisParser DefaultTotality
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return DefaultTotality
DefaultCheckingPartial
IdrisParser DefaultTotality
-> IdrisParser DefaultTotality -> IdrisParser DefaultTotality
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"covering"; DefaultTotality -> IdrisParser DefaultTotality
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return DefaultTotality
DefaultCheckingCovering
provider :: SyntaxInfo -> IdrisParser [PDecl]
provider :: SyntaxInfo -> IdrisParser [PDecl]
provider SyntaxInfo
syn = do Docstring (Either Err PTerm)
doc <- StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (Either Err PTerm))
-> StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (Either Err PTerm))
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (do (Docstring (Either Err PTerm)
doc, [(Name, Docstring (Either Err PTerm))]
_) <- SyntaxInfo
-> IdrisParser
(Docstring (Either Err PTerm),
[(Name, Docstring (Either Err PTerm))])
docstring SyntaxInfo
syn
OutputAnnotation
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *) a.
(MonadState IState m, Parsing m) =>
OutputAnnotation -> m a -> m a
highlight OutputAnnotation
AnnKeyword (StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ())
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b. (a -> b) -> a -> b
$ Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"provide"
Docstring (Either Err PTerm)
-> StateT
IState
(WriterT FC (Parsec Void String))
(Docstring (Either Err PTerm))
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return Docstring (Either Err PTerm)
doc)
Docstring (Either Err PTerm) -> IdrisParser [PDecl]
provideTerm Docstring (Either Err PTerm)
doc IdrisParser [PDecl] -> IdrisParser [PDecl] -> IdrisParser [PDecl]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> Docstring (Either Err PTerm) -> IdrisParser [PDecl]
providePostulate Docstring (Either Err PTerm)
doc
IdrisParser [PDecl] -> String -> IdrisParser [PDecl]
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"type provider"
where provideTerm :: Docstring (Either Err PTerm) -> IdrisParser [PDecl]
provideTerm Docstring (Either Err PTerm)
doc =
do Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'('; (Name
n, FC
nfc) <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName; Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
':'; PTerm
t <- SyntaxInfo -> IdrisParser PTerm
typeExpr SyntaxInfo
syn; Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
')'
String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"with"
(PTerm
e, FC
fc) <- IdrisParser PTerm -> IdrisParser (PTerm, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (SyntaxInfo -> IdrisParser PTerm
expr SyntaxInfo
syn) IdrisParser (PTerm, FC) -> String -> IdrisParser (PTerm, FC)
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"provider expression"
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Docstring (Either Err PTerm)
-> SyntaxInfo -> FC -> FC -> ProvideWhat' PTerm -> Name -> PDecl
forall t.
Docstring (Either Err t)
-> SyntaxInfo -> FC -> FC -> ProvideWhat' t -> Name -> PDecl' t
PProvider Docstring (Either Err PTerm)
doc SyntaxInfo
syn FC
fc FC
nfc (PTerm -> PTerm -> ProvideWhat' PTerm
forall t. t -> t -> ProvideWhat' t
ProvTerm PTerm
t PTerm
e) Name
n]
providePostulate :: Docstring (Either Err PTerm) -> IdrisParser [PDecl]
providePostulate Docstring (Either Err PTerm)
doc =
do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"postulate"
(Name
n, FC
nfc) <- StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT IState (WriterT FC (Parsec Void String)) (Name, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName
String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *).
(Parsing m, MonadState IState m) =>
String -> m ()
keyword String
"with"
(PTerm
e, FC
fc) <- IdrisParser PTerm -> IdrisParser (PTerm, FC)
forall (m :: * -> *) a. MonadWriter FC m => m a -> m (a, FC)
withExtent (SyntaxInfo -> IdrisParser PTerm
expr SyntaxInfo
syn) IdrisParser (PTerm, FC) -> String -> IdrisParser (PTerm, FC)
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"provider expression"
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [Docstring (Either Err PTerm)
-> SyntaxInfo -> FC -> FC -> ProvideWhat' PTerm -> Name -> PDecl
forall t.
Docstring (Either Err t)
-> SyntaxInfo -> FC -> FC -> ProvideWhat' t -> Name -> PDecl' t
PProvider Docstring (Either Err PTerm)
doc SyntaxInfo
syn FC
fc FC
nfc (PTerm -> ProvideWhat' PTerm
forall t. t -> ProvideWhat' t
ProvPostulate PTerm
e) Name
n]
transform :: SyntaxInfo -> IdrisParser [PDecl]
transform :: SyntaxInfo -> IdrisParser [PDecl]
transform SyntaxInfo
syn = do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"transform")
PTerm
l <- SyntaxInfo -> IdrisParser PTerm
expr SyntaxInfo
syn
FC
fc <- StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall (m :: * -> *) a. MonadWriter FC m => m a -> m FC
extent (StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC)
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall a b. (a -> b) -> a -> b
$ String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
symbol String
"==>"
PTerm
r <- SyntaxInfo -> IdrisParser PTerm
expr SyntaxInfo
syn
[PDecl] -> IdrisParser [PDecl]
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return [FC -> Bool -> PTerm -> PTerm -> PDecl
forall t. FC -> Bool -> t -> t -> PDecl' t
PTransform FC
fc Bool
False PTerm
l PTerm
r]
IdrisParser [PDecl] -> String -> IdrisParser [PDecl]
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"transform"
runElabDecl :: SyntaxInfo -> IdrisParser PDecl
runElabDecl :: SyntaxInfo -> IdrisParser PDecl
runElabDecl SyntaxInfo
syn =
do FC
kwFC <- StateT IState (WriterT FC (Parsec Void String)) FC
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall e s (m :: * -> *) a. MonadParsec e s m => m a -> m a
P.try (OutputAnnotation
-> StateT IState (WriterT FC (Parsec Void String)) FC
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall (m :: * -> *) a.
(MonadState IState m, Parsing m) =>
OutputAnnotation -> m a -> m a
highlight OutputAnnotation
AnnKeyword (StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall (m :: * -> *) a. MonadWriter FC m => m a -> m FC
extent (StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC)
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) FC
forall a b. (a -> b) -> a -> b
$ Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
lchar Char
'%' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"runElab"))
PTerm
script <- SyntaxInfo -> IdrisParser PTerm
expr SyntaxInfo
syn IdrisParser PTerm -> String -> IdrisParser PTerm
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"elaborator script"
PDecl -> IdrisParser PDecl
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (PDecl -> IdrisParser PDecl) -> PDecl -> IdrisParser PDecl
forall a b. (a -> b) -> a -> b
$ FC -> PTerm -> [String] -> PDecl
forall t. FC -> t -> [String] -> PDecl' t
PRunElabDecl FC
kwFC PTerm
script (SyntaxInfo -> [String]
syn_namespace SyntaxInfo
syn)
IdrisParser PDecl -> String -> IdrisParser PDecl
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"top-level elaborator script"
parseExpr :: IState -> String -> Either ParseError PTerm
parseExpr :: IState -> String -> Either ParseError PTerm
parseExpr IState
st = IdrisParser PTerm
-> IState -> String -> String -> Either ParseError PTerm
forall st res.
Parser st res -> st -> String -> String -> Either ParseError res
runparser (SyntaxInfo -> IdrisParser PTerm
fullExpr SyntaxInfo
defaultSyntax) IState
st String
"(input)"
parseConst :: IState -> String -> Either ParseError Const
parseConst :: IState -> String -> Either ParseError Const
parseConst IState
st = Parser IState Const
-> IState -> String -> String -> Either ParseError Const
forall st res.
Parser st res -> st -> String -> String -> Either ParseError res
runparser Parser IState Const
forall (m :: * -> *). Parsing m => m Const
constant IState
st String
"(input)"
parseTactic :: IState -> String -> Either ParseError PTactic
parseTactic :: IState -> String -> Either ParseError PTactic
parseTactic IState
st = Parser IState PTactic
-> IState -> String -> String -> Either ParseError PTactic
forall st res.
Parser st res -> st -> String -> String -> Either ParseError res
runparser (SyntaxInfo -> Parser IState PTactic
fullTactic SyntaxInfo
defaultSyntax) IState
st String
"(input)"
parseElabShellStep :: IState -> String -> Either ParseError (Either ElabShellCmd PDo)
parseElabShellStep :: IState -> String -> Either ParseError (Either ElabShellCmd PDo)
parseElabShellStep IState
ist = Parser IState (Either ElabShellCmd PDo)
-> IState
-> String
-> String
-> Either ParseError (Either ElabShellCmd PDo)
forall st res.
Parser st res -> st -> String -> String -> Either ParseError res
runparser (PDo -> Either ElabShellCmd PDo
forall a b. b -> Either a b
Right (PDo -> Either ElabShellCmd PDo)
-> StateT IState (WriterT FC (Parsec Void String)) PDo
-> Parser IState (Either ElabShellCmd PDo)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> SyntaxInfo -> StateT IState (WriterT FC (Parsec Void String)) PDo
do_ SyntaxInfo
defaultSyntax Parser IState (Either ElabShellCmd PDo)
-> Parser IState (Either ElabShellCmd PDo)
-> Parser IState (Either ElabShellCmd PDo)
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> ElabShellCmd -> Either ElabShellCmd PDo
forall a b. a -> Either a b
Left (ElabShellCmd -> Either ElabShellCmd PDo)
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> Parser IState (Either ElabShellCmd PDo)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
elabShellCmd) IState
ist String
"(input)"
where elabShellCmd :: StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
elabShellCmd = Char -> StateT IState (WriterT FC (Parsec Void String)) Char
forall (m :: * -> *). Parsing m => Char -> m Char
char Char
':' StateT IState (WriterT FC (Parsec Void String)) Char
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>>
(String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"qed" StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ElabShellCmd
EQED ) StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|>
(String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"abandon" StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ElabShellCmd
EAbandon ) StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|>
(String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"undo" StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ElabShellCmd
EUndo ) StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|>
(String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"state" StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ElabShellCmd
EProofState) StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|>
(String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"term" StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ElabShellCmd
EProofTerm ) StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|>
([String]
-> (PTerm -> ElabShellCmd)
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall {b}.
[String]
-> (PTerm -> b)
-> StateT IState (WriterT FC (Parsec Void String)) b
expressionTactic [String
"e", String
"eval"] PTerm -> ElabShellCmd
EEval ) StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|>
([String]
-> (PTerm -> ElabShellCmd)
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall {b}.
[String]
-> (PTerm -> b)
-> StateT IState (WriterT FC (Parsec Void String)) b
expressionTactic [String
"t", String
"type"] PTerm -> ElabShellCmd
ECheck) StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|>
([String]
-> (PTerm -> ElabShellCmd)
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall {b}.
[String]
-> (PTerm -> b)
-> StateT IState (WriterT FC (Parsec Void String)) b
expressionTactic [String
"search"] PTerm -> ElabShellCmd
ESearch ) StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|>
(do String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved String
"doc"
Either Name Const
doc <- (Const -> Either Name Const
forall a b. b -> Either a b
Right (Const -> Either Name Const)
-> Parser IState Const
-> StateT
IState (WriterT FC (Parsec Void String)) (Either Name Const)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser IState Const
forall (m :: * -> *). Parsing m => m Const
constant) StateT IState (WriterT FC (Parsec Void String)) (Either Name Const)
-> StateT
IState (WriterT FC (Parsec Void String)) (Either Name Const)
-> StateT
IState (WriterT FC (Parsec Void String)) (Either Name Const)
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Name -> Either Name Const
forall a b. a -> Either a b
Left (Name -> Either Name Const)
-> StateT IState (WriterT FC (Parsec Void String)) Name
-> StateT
IState (WriterT FC (Parsec Void String)) (Either Name Const)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> StateT IState (WriterT FC (Parsec Void String)) Name
forall (m :: * -> *). (Parsing m, MonadState IState m) => m Name
fnName)
StateT IState (WriterT FC (Parsec Void String)) ()
forall e s (m :: * -> *). MonadParsec e s m => m ()
P.eof
ElabShellCmd
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Either Name Const -> ElabShellCmd
EDocStr Either Name Const
doc))
StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
-> String
-> StateT IState (WriterT FC (Parsec Void String)) ElabShellCmd
forall e s (m :: * -> *) a.
MonadParsec e s m =>
m a -> String -> m a
<?> String
"elab command"
expressionTactic :: [String]
-> (PTerm -> b)
-> StateT IState (WriterT FC (Parsec Void String)) b
expressionTactic [String]
cmds PTerm -> b
tactic =
do [StateT IState (WriterT FC (Parsec Void String)) ()]
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall (f :: * -> *) (m :: * -> *) a.
(Foldable f, Alternative m) =>
f (m a) -> m a
asum ((String -> StateT IState (WriterT FC (Parsec Void String)) ())
-> [String] -> [StateT IState (WriterT FC (Parsec Void String)) ()]
forall a b. (a -> b) -> [a] -> [b]
map String -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => String -> m ()
reserved [String]
cmds)
PTerm
t <- IdrisParser PTerm -> IdrisParser PTerm
forall {f :: * -> *} {b}.
(MonadFail f, MonadParsec Void String f, MonadWriter FC f,
MonadState IState f) =>
f b -> f b
spaced (SyntaxInfo -> IdrisParser PTerm
expr SyntaxInfo
defaultSyntax)
IState
i <- StateT IState (WriterT FC (Parsec Void String)) IState
forall s (m :: * -> *). MonadState s m => m s
get
b -> StateT IState (WriterT FC (Parsec Void String)) b
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return (b -> StateT IState (WriterT FC (Parsec Void String)) b)
-> b -> StateT IState (WriterT FC (Parsec Void String)) b
forall a b. (a -> b) -> a -> b
$ PTerm -> b
tactic (SyntaxInfo -> IState -> PTerm -> PTerm
desugar SyntaxInfo
defaultSyntax IState
i PTerm
t)
spaced :: f b -> f b
spaced f b
parser = f ()
forall (m :: * -> *). (Parsing m, MonadState IState m) => m ()
indentGt f () -> f b -> f b
forall a b. f a -> f b -> f b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> f b
parser
parseImports :: FilePath -> String -> Idris (Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark)
parseImports :: String
-> String
-> Idris (Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark)
parseImports String
fname String
input
= do IState
i <- Idris IState
getIState
case Parser
IState
((Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark),
[(FC, OutputAnnotation)], IState)
-> IState
-> String
-> String
-> Either
ParseError
((Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark),
[(FC, OutputAnnotation)], IState)
forall st res.
Parser st res -> st -> String -> String -> Either ParseError res
runparser Parser
IState
((Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark),
[(FC, OutputAnnotation)], IState)
imports IState
i String
fname String
input of
Left ParseError
err -> ParseError -> Idris OutputDoc
forall w. Message w => w -> Idris OutputDoc
formatMessage ParseError
err Idris OutputDoc
-> (OutputDoc
-> Idris
(Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark))
-> Idris (Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark)
forall a b.
StateT IState (ExceptT Err IO) a
-> (a -> StateT IState (ExceptT Err IO) b)
-> StateT IState (ExceptT Err IO) b
forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= String
-> Idris (Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark)
forall a. String -> Idris a
ifail (String
-> Idris
(Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark))
-> (OutputDoc -> String)
-> OutputDoc
-> Idris (Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. OutputDoc -> String
forall a. Show a => a -> String
show
Right ((Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark)
x, [(FC, OutputAnnotation)]
annots, IState
i) ->
do IState -> Idris ()
putIState IState
i
String
fname' <- IO String -> Idris String
forall a. IO a -> Idris a
runIO (IO String -> Idris String) -> IO String -> Idris String
forall a b. (a -> b) -> a -> b
$ String -> IO String
Dir.makeAbsolute String
fname
Set (FC', OutputAnnotation) -> Idris ()
sendHighlighting (Set (FC', OutputAnnotation) -> Idris ())
-> Set (FC', OutputAnnotation) -> Idris ()
forall a b. (a -> b) -> a -> b
$ [(FC', OutputAnnotation)] -> Set (FC', OutputAnnotation)
forall a. Ord a => [a] -> Set a
S.fromList ([(FC', OutputAnnotation)] -> Set (FC', OutputAnnotation))
-> [(FC', OutputAnnotation)] -> Set (FC', OutputAnnotation)
forall a b. (a -> b) -> a -> b
$ [(FC, OutputAnnotation)] -> String -> [(FC', OutputAnnotation)]
addPath [(FC, OutputAnnotation)]
annots String
fname'
(Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark)
-> Idris (Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark)
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark)
x
where imports :: IdrisParser ((Maybe (Docstring ()), [String],
[ImportInfo],
Maybe Mark),
[(FC, OutputAnnotation)], IState)
imports :: Parser
IState
((Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark),
[(FC, OutputAnnotation)], IState)
imports = do StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) (Maybe ())
forall (f :: * -> *) a. Alternative f => f a -> f (Maybe a)
optional StateT IState (WriterT FC (Parsec Void String)) ()
shebang
StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => m ()
whiteSpace
(Maybe (Docstring ())
mdoc, [String]
mname, [(FC, OutputAnnotation)]
annots) <- IdrisParser
(Maybe (Docstring ()), [String], [(FC, OutputAnnotation)])
moduleHeader
[ImportInfo]
ps_exp <- IdrisParser ImportInfo
-> StateT IState (WriterT FC (Parsec Void String)) [ImportInfo]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many IdrisParser ImportInfo
import_
Mark
mrk <- StateT IState (WriterT FC (Parsec Void String)) Mark
forall (m :: * -> *). Parsing m => m Mark
mark
Bool
isEof <- StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) Bool
forall (m :: * -> *) a. Parsing m => m a -> m Bool
lookAheadMatches StateT IState (WriterT FC (Parsec Void String)) ()
forall e s (m :: * -> *). MonadParsec e s m => m ()
P.eof
let mrk' :: Maybe Mark
mrk' = if Bool
isEof
then Maybe Mark
forall a. Maybe a
Nothing
else Mark -> Maybe Mark
forall a. a -> Maybe a
Just Mark
mrk
IState
i <- StateT IState (WriterT FC (Parsec Void String)) IState
forall s (m :: * -> *). MonadState s m => m s
get
let ps :: [ImportInfo]
ps = [ImportInfo]
ps_exp
((Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark),
[(FC, OutputAnnotation)], IState)
-> Parser
IState
((Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark),
[(FC, OutputAnnotation)], IState)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return ((Maybe (Docstring ())
mdoc, [String]
mname, [ImportInfo]
ps, Maybe Mark
mrk'), [(FC, OutputAnnotation)]
annots, IState
i)
addPath :: [(FC, OutputAnnotation)] -> FilePath -> [(FC', OutputAnnotation)]
addPath :: [(FC, OutputAnnotation)] -> String -> [(FC', OutputAnnotation)]
addPath [] String
_ = []
addPath ((FC
fc, AnnNamespace [Text]
ns Maybe String
Nothing) : [(FC, OutputAnnotation)]
annots) String
path =
(FC -> FC'
FC' FC
fc, [Text] -> Maybe String -> OutputAnnotation
AnnNamespace [Text]
ns (String -> Maybe String
forall a. a -> Maybe a
Just String
path)) (FC', OutputAnnotation)
-> [(FC', OutputAnnotation)] -> [(FC', OutputAnnotation)]
forall a. a -> [a] -> [a]
: [(FC, OutputAnnotation)] -> String -> [(FC', OutputAnnotation)]
addPath [(FC, OutputAnnotation)]
annots String
path
addPath ((FC
fc,OutputAnnotation
annot):[(FC, OutputAnnotation)]
annots) String
path = (FC -> FC'
FC' FC
fc, OutputAnnotation
annot) (FC', OutputAnnotation)
-> [(FC', OutputAnnotation)] -> [(FC', OutputAnnotation)]
forall a. a -> [a] -> [a]
: [(FC, OutputAnnotation)] -> String -> [(FC', OutputAnnotation)]
addPath [(FC, OutputAnnotation)]
annots String
path
shebang :: IdrisParser ()
shebang :: StateT IState (WriterT FC (Parsec Void String)) ()
shebang = String -> StateT IState (WriterT FC (Parsec Void String)) String
forall (m :: * -> *). Parsing m => String -> m String
string String
"#!" StateT IState (WriterT FC (Parsec Void String)) String
-> StateT IState (WriterT FC (Parsec Void String)) [Token String]
-> StateT IState (WriterT FC (Parsec Void String)) [Token String]
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> StateT IState (WriterT FC (Parsec Void String)) (Token String)
-> StateT IState (WriterT FC (Parsec Void String)) [Token String]
forall a.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) [a]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
many ((Token String -> Bool)
-> StateT IState (WriterT FC (Parsec Void String)) (Token String)
forall e s (m :: * -> *).
MonadParsec e s m =>
(Token s -> Bool) -> m (Token s)
P.satisfy ((Token String -> Bool)
-> StateT IState (WriterT FC (Parsec Void String)) (Token String))
-> (Token String -> Bool)
-> StateT IState (WriterT FC (Parsec Void String)) (Token String)
forall a b. (a -> b) -> a -> b
$ Bool -> Bool
not (Bool -> Bool) -> (Char -> Bool) -> Char -> Bool
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Char -> Bool
isEol) StateT IState (WriterT FC (Parsec Void String)) [Token String]
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => m ()
eol StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
-> StateT IState (WriterT FC (Parsec Void String)) ()
forall a b.
StateT IState (WriterT FC (Parsec Void String)) a
-> StateT IState (WriterT FC (Parsec Void String)) b
-> StateT IState (WriterT FC (Parsec Void String)) b
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> () -> StateT IState (WriterT FC (Parsec Void String)) ()
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ()
fixColour :: Bool -> PP.Doc -> PP.Doc
fixColour :: Bool -> Doc -> Doc
fixColour Bool
False Doc
doc = Doc -> Doc
PP.plain Doc
doc
fixColour Bool
True Doc
doc = Doc
doc
parseProg :: SyntaxInfo -> FilePath -> String -> Maybe Mark -> Idris [PDecl]
parseProg :: SyntaxInfo -> String -> String -> Maybe Mark -> Idris [PDecl]
parseProg SyntaxInfo
syn String
fname String
input Maybe Mark
mrk
= do IState
i <- Idris IState
getIState
case Parser IState ([PDecl], IState)
-> IState
-> String
-> String
-> Either ParseError ([PDecl], IState)
forall st res.
Parser st res -> st -> String -> String -> Either ParseError res
runparser Parser IState ([PDecl], IState)
mainProg IState
i String
fname String
input of
Left ParseError
err -> do ParseError -> Idris ()
forall w. Message w => w -> Idris ()
emitWarning ParseError
err
IState
i <- Idris IState
getIState
IState -> Idris ()
putIState (IState
i { errSpan = Just (messageExtent err) })
[PDecl] -> Idris [PDecl]
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return []
Right ([PDecl]
x, IState
i) -> do IState -> Idris ()
putIState IState
i
Idris ()
reportParserWarnings
[PDecl] -> Idris [PDecl]
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return ([PDecl] -> Idris [PDecl]) -> [PDecl] -> Idris [PDecl]
forall a b. (a -> b) -> a -> b
$ [PDecl] -> [PDecl]
collect [PDecl]
x
where mainProg :: IdrisParser ([PDecl], IState)
mainProg :: Parser IState ([PDecl], IState)
mainProg = case Maybe Mark
mrk of
Maybe Mark
Nothing -> do IState
i <- StateT IState (WriterT FC (Parsec Void String)) IState
forall s (m :: * -> *). MonadState s m => m s
get; ([PDecl], IState) -> Parser IState ([PDecl], IState)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return ([], IState
i)
Just Mark
mrk -> do
Mark -> StateT IState (WriterT FC (Parsec Void String)) ()
forall (m :: * -> *). Parsing m => Mark -> m ()
restore Mark
mrk
[PDecl]
ds <- SyntaxInfo -> IdrisParser [PDecl]
prog SyntaxInfo
syn
IState
i' <- StateT IState (WriterT FC (Parsec Void String)) IState
forall s (m :: * -> *). MonadState s m => m s
get
([PDecl], IState) -> Parser IState ([PDecl], IState)
forall a. a -> StateT IState (WriterT FC (Parsec Void String)) a
forall (m :: * -> *) a. Monad m => a -> m a
return ([PDecl]
ds, IState
i')
collect :: [PDecl] -> [PDecl]
collect :: [PDecl] -> [PDecl]
collect (c :: PDecl
c@(PClauses FC
_ FnOpts
o Name
_ [PClause' PTerm]
_) : [PDecl]
ds)
= Maybe Name -> [PClause' PTerm] -> [PDecl] -> [PDecl]
clauses (PDecl -> Maybe Name
cname PDecl
c) [] (PDecl
c PDecl -> [PDecl] -> [PDecl]
forall a. a -> [a] -> [a]
: [PDecl]
ds)
where clauses :: Maybe Name -> [PClause] -> [PDecl] -> [PDecl]
clauses :: Maybe Name -> [PClause' PTerm] -> [PDecl] -> [PDecl]
clauses j :: Maybe Name
j@(Just Name
n) [PClause' PTerm]
acc (PClauses FC
fc FnOpts
_ Name
_ [PClause FC
fc' Name
n' PTerm
l [PTerm]
ws PTerm
r [PDecl]
w] : [PDecl]
ds)
| Name
n Name -> Name -> Bool
forall a. Eq a => a -> a -> Bool
== Name
n' = Maybe Name -> [PClause' PTerm] -> [PDecl] -> [PDecl]
clauses Maybe Name
j (FC
-> Name -> PTerm -> [PTerm] -> PTerm -> [PDecl] -> PClause' PTerm
forall t. FC -> Name -> t -> [t] -> t -> [PDecl' t] -> PClause' t
PClause FC
fc' Name
n' PTerm
l [PTerm]
ws PTerm
r ([PDecl] -> [PDecl]
collect [PDecl]
w) PClause' PTerm -> [PClause' PTerm] -> [PClause' PTerm]
forall a. a -> [a] -> [a]
: [PClause' PTerm]
acc) [PDecl]
ds
clauses j :: Maybe Name
j@(Just Name
n) [PClause' PTerm]
acc (PClauses FC
fc FnOpts
_ Name
_ [PWith FC
fc' Name
n' PTerm
l [PTerm]
ws PTerm
r Maybe (Name, FC)
pn [PDecl]
w] : [PDecl]
ds)
| Name
n Name -> Name -> Bool
forall a. Eq a => a -> a -> Bool
== Name
n' = Maybe Name -> [PClause' PTerm] -> [PDecl] -> [PDecl]
clauses Maybe Name
j (FC
-> Name
-> PTerm
-> [PTerm]
-> PTerm
-> Maybe (Name, FC)
-> [PDecl]
-> PClause' PTerm
forall t.
FC
-> Name
-> t
-> [t]
-> t
-> Maybe (Name, FC)
-> [PDecl' t]
-> PClause' t
PWith FC
fc' Name
n' PTerm
l [PTerm]
ws PTerm
r Maybe (Name, FC)
pn ([PDecl] -> [PDecl]
collect [PDecl]
w) PClause' PTerm -> [PClause' PTerm] -> [PClause' PTerm]
forall a. a -> [a] -> [a]
: [PClause' PTerm]
acc) [PDecl]
ds
clauses (Just Name
n) [PClause' PTerm]
acc [PDecl]
xs = FC -> FnOpts -> Name -> [PClause' PTerm] -> PDecl
forall t. FC -> FnOpts -> Name -> [PClause' t] -> PDecl' t
PClauses (PDecl -> FC
fcOf PDecl
c) FnOpts
o Name
n ([PClause' PTerm] -> [PClause' PTerm]
forall a. [a] -> [a]
reverse [PClause' PTerm]
acc) PDecl -> [PDecl] -> [PDecl]
forall a. a -> [a] -> [a]
: [PDecl] -> [PDecl]
collect [PDecl]
xs
clauses Maybe Name
Nothing [PClause' PTerm]
acc (PDecl
x:[PDecl]
xs) = [PDecl] -> [PDecl]
collect [PDecl]
xs
clauses Maybe Name
Nothing [PClause' PTerm]
acc [] = []
cname :: PDecl -> Maybe Name
cname :: PDecl -> Maybe Name
cname (PClauses FC
fc FnOpts
_ Name
_ [PClause FC
_ Name
n PTerm
_ [PTerm]
_ PTerm
_ [PDecl]
_]) = Name -> Maybe Name
forall a. a -> Maybe a
Just Name
n
cname (PClauses FC
fc FnOpts
_ Name
_ [PWith FC
_ Name
n PTerm
_ [PTerm]
_ PTerm
_ Maybe (Name, FC)
_ [PDecl]
_]) = Name -> Maybe Name
forall a. a -> Maybe a
Just Name
n
cname (PClauses FC
fc FnOpts
_ Name
_ [PClauseR FC
_ [PTerm]
_ PTerm
_ [PDecl]
_]) = Maybe Name
forall a. Maybe a
Nothing
cname (PClauses FC
fc FnOpts
_ Name
_ [PWithR FC
_ [PTerm]
_ PTerm
_ Maybe (Name, FC)
_ [PDecl]
_]) = Maybe Name
forall a. Maybe a
Nothing
fcOf :: PDecl -> FC
fcOf :: PDecl -> FC
fcOf (PClauses FC
fc FnOpts
_ Name
_ [PClause' PTerm]
_) = FC
fc
collect (PParams FC
f [(Name, PTerm)]
ns [PDecl]
ps : [PDecl]
ds) = FC -> [(Name, PTerm)] -> [PDecl] -> PDecl
forall t. FC -> [(Name, t)] -> [PDecl' t] -> PDecl' t
PParams FC
f [(Name, PTerm)]
ns ([PDecl] -> [PDecl]
collect [PDecl]
ps) PDecl -> [PDecl] -> [PDecl]
forall a. a -> [a] -> [a]
: [PDecl] -> [PDecl]
collect [PDecl]
ds
collect (POpenInterfaces FC
f [Name]
ns [PDecl]
ps : [PDecl]
ds) = FC -> [Name] -> [PDecl] -> PDecl
forall t. FC -> [Name] -> [PDecl' t] -> PDecl' t
POpenInterfaces FC
f [Name]
ns ([PDecl] -> [PDecl]
collect [PDecl]
ps) PDecl -> [PDecl] -> [PDecl]
forall a. a -> [a] -> [a]
: [PDecl] -> [PDecl]
collect [PDecl]
ds
collect (PMutual FC
f [PDecl]
ms : [PDecl]
ds) = FC -> [PDecl] -> PDecl
forall t. FC -> [PDecl' t] -> PDecl' t
PMutual FC
f ([PDecl] -> [PDecl]
collect [PDecl]
ms) PDecl -> [PDecl] -> [PDecl]
forall a. a -> [a] -> [a]
: [PDecl] -> [PDecl]
collect [PDecl]
ds
collect (PNamespace String
ns FC
fc [PDecl]
ps : [PDecl]
ds) = String -> FC -> [PDecl] -> PDecl
forall t. String -> FC -> [PDecl' t] -> PDecl' t
PNamespace String
ns FC
fc ([PDecl] -> [PDecl]
collect [PDecl]
ps) PDecl -> [PDecl] -> [PDecl]
forall a. a -> [a] -> [a]
: [PDecl] -> [PDecl]
collect [PDecl]
ds
collect (PInterface Docstring (Either Err PTerm)
doc SyntaxInfo
f FC
s [(Name, PTerm)]
cs Name
n FC
nfc [(Name, FC, PTerm)]
ps [(Name, Docstring (Either Err PTerm))]
pdocs [(Name, FC)]
fds [PDecl]
ds Maybe (Name, FC)
cn Docstring (Either Err PTerm)
cd : [PDecl]
ds')
= Docstring (Either Err PTerm)
-> SyntaxInfo
-> FC
-> [(Name, PTerm)]
-> Name
-> FC
-> [(Name, FC, PTerm)]
-> [(Name, Docstring (Either Err PTerm))]
-> [(Name, FC)]
-> [PDecl]
-> Maybe (Name, FC)
-> Docstring (Either Err PTerm)
-> PDecl
forall t.
Docstring (Either Err t)
-> SyntaxInfo
-> FC
-> [(Name, t)]
-> Name
-> FC
-> [(Name, FC, t)]
-> [(Name, Docstring (Either Err t))]
-> [(Name, FC)]
-> [PDecl' t]
-> Maybe (Name, FC)
-> Docstring (Either Err t)
-> PDecl' t
PInterface Docstring (Either Err PTerm)
doc SyntaxInfo
f FC
s [(Name, PTerm)]
cs Name
n FC
nfc [(Name, FC, PTerm)]
ps [(Name, Docstring (Either Err PTerm))]
pdocs [(Name, FC)]
fds ([PDecl] -> [PDecl]
collect [PDecl]
ds) Maybe (Name, FC)
cn Docstring (Either Err PTerm)
cd PDecl -> [PDecl] -> [PDecl]
forall a. a -> [a] -> [a]
: [PDecl] -> [PDecl]
collect [PDecl]
ds'
collect (PImplementation Docstring (Either Err PTerm)
doc [(Name, Docstring (Either Err PTerm))]
argDocs SyntaxInfo
f FC
s [(Name, PTerm)]
cs [Name]
pnames Accessibility
acc FnOpts
opts Name
n FC
nfc [PTerm]
ps [(Name, PTerm)]
pextra PTerm
t Maybe Name
en [PDecl]
ds : [PDecl]
ds')
= Docstring (Either Err PTerm)
-> [(Name, Docstring (Either Err PTerm))]
-> SyntaxInfo
-> FC
-> [(Name, PTerm)]
-> [Name]
-> Accessibility
-> FnOpts
-> Name
-> FC
-> [PTerm]
-> [(Name, PTerm)]
-> PTerm
-> Maybe Name
-> [PDecl]
-> PDecl
forall t.
Docstring (Either Err t)
-> [(Name, Docstring (Either Err t))]
-> SyntaxInfo
-> FC
-> [(Name, t)]
-> [Name]
-> Accessibility
-> FnOpts
-> Name
-> FC
-> [t]
-> [(Name, t)]
-> t
-> Maybe Name
-> [PDecl' t]
-> PDecl' t
PImplementation Docstring (Either Err PTerm)
doc [(Name, Docstring (Either Err PTerm))]
argDocs SyntaxInfo
f FC
s [(Name, PTerm)]
cs [Name]
pnames Accessibility
acc FnOpts
opts Name
n FC
nfc [PTerm]
ps [(Name, PTerm)]
pextra PTerm
t Maybe Name
en ([PDecl] -> [PDecl]
collect [PDecl]
ds) PDecl -> [PDecl] -> [PDecl]
forall a. a -> [a] -> [a]
: [PDecl] -> [PDecl]
collect [PDecl]
ds'
collect (PDecl
d : [PDecl]
ds) = PDecl
d PDecl -> [PDecl] -> [PDecl]
forall a. a -> [a] -> [a]
: [PDecl] -> [PDecl]
collect [PDecl]
ds
collect [] = []
loadModule :: FilePath -> IBCPhase -> Idris (Maybe String)
loadModule :: String -> IBCPhase -> Idris (Maybe String)
loadModule String
f IBCPhase
phase
= Idris (Maybe String)
-> (Err -> Idris (Maybe String)) -> Idris (Maybe String)
forall a. Idris a -> (Err -> Idris a) -> Idris a
idrisCatch (String -> IBCPhase -> Idris (Maybe String)
loadModule' String
f IBCPhase
phase)
(\Err
e -> do FC -> Idris ()
setErrSpan (Err -> FC
getErrSpan Err
e)
IState
ist <- Idris IState
getIState
FC -> OutputDoc -> Idris ()
iWarn (Err -> FC
getErrSpan Err
e) (OutputDoc -> Idris ()) -> OutputDoc -> Idris ()
forall a b. (a -> b) -> a -> b
$ IState -> Err -> OutputDoc
pprintErr IState
ist Err
e
Maybe String -> Idris (Maybe String)
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe String
forall a. Maybe a
Nothing)
loadModule' :: FilePath -> IBCPhase -> Idris (Maybe String)
loadModule' :: String -> IBCPhase -> Idris (Maybe String)
loadModule' String
f IBCPhase
phase
= do IState
i <- Idris IState
getIState
let file :: String
file = (Char -> Bool) -> String -> String
forall a. (a -> Bool) -> [a] -> [a]
takeWhile (Char -> Char -> Bool
forall a. Eq a => a -> a -> Bool
/= Char
' ') String
f
String
ibcsd <- IState -> Idris String
valIBCSubDir IState
i
[String]
ids <- String -> Idris [String]
rankedImportDirs String
file
IFileType
fp <- [String] -> String -> String -> Idris IFileType
findImport [String]
ids String
ibcsd String
file
if String
file String -> [String] -> Bool
forall a. Eq a => a -> [a] -> Bool
forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
`elem` IState -> [String]
imported IState
i
then do Int -> String -> Idris ()
logParser Int
1 (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
"Already read " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
file
Maybe String -> Idris (Maybe String)
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe String
forall a. Maybe a
Nothing
else do IState -> Idris ()
putIState (IState
i { imported = file : imported i })
case IFileType
fp of
IDR String
fn -> Bool -> String -> Maybe Int -> Idris ()
loadSource Bool
False String
fn Maybe Int
forall a. Maybe a
Nothing
LIDR String
fn -> Bool -> String -> Maybe Int -> Idris ()
loadSource Bool
True String
fn Maybe Int
forall a. Maybe a
Nothing
IBC String
fn IFileType
src ->
Idris () -> (Err -> Idris ()) -> Idris ()
forall a. Idris a -> (Err -> Idris a) -> Idris a
idrisCatch (Bool -> IBCPhase -> String -> Idris ()
loadIBC Bool
True IBCPhase
phase String
fn)
(\Err
c -> do Int -> String -> Idris ()
logParser Int
1 (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
fn String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
" failed " String -> String -> String
forall a. [a] -> [a] -> [a]
++ IState -> Err -> String
pshow IState
i Err
c
case IFileType
src of
IDR String
sfn -> Bool -> String -> Maybe Int -> Idris ()
loadSource Bool
False String
sfn Maybe Int
forall a. Maybe a
Nothing
LIDR String
sfn -> Bool -> String -> Maybe Int -> Idris ()
loadSource Bool
True String
sfn Maybe Int
forall a. Maybe a
Nothing)
Maybe String -> Idris (Maybe String)
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return (Maybe String -> Idris (Maybe String))
-> Maybe String -> Idris (Maybe String)
forall a b. (a -> b) -> a -> b
$ String -> Maybe String
forall a. a -> Maybe a
Just String
file
loadFromIFile :: Bool -> IBCPhase -> IFileType -> Maybe Int -> Idris ()
loadFromIFile :: Bool -> IBCPhase -> IFileType -> Maybe Int -> Idris ()
loadFromIFile Bool
reexp IBCPhase
phase i :: IFileType
i@(IBC String
fn IFileType
src) Maybe Int
maxline
= do Int -> String -> Idris ()
logParser Int
1 (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
"Skipping " String -> String -> String
forall a. [a] -> [a] -> [a]
++ IFileType -> String
getSrcFile IFileType
i
Int -> String -> Idris ()
logParser Int
3 (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
"loadFromIFile i" String -> String -> String
forall a. [a] -> [a] -> [a]
++ IFileType -> String
forall a. Show a => a -> String
show IFileType
i
Idris () -> (Err -> Idris ()) -> Idris ()
forall a. Idris a -> (Err -> Idris a) -> Idris a
idrisCatch (Bool -> IBCPhase -> String -> Idris ()
loadIBC Bool
reexp IBCPhase
phase String
fn)
(\Err
err -> Err -> Idris ()
forall a. Err -> Idris a
ierror (Err -> Idris ()) -> Err -> Idris ()
forall a b. (a -> b) -> a -> b
$ String -> Err -> Err
forall t. String -> Err' t -> Err' t
LoadingFailed String
fn Err
err)
where
getSrcFile :: IFileType -> String
getSrcFile (IDR String
fn) = String
fn
getSrcFile (LIDR String
fn) = String
fn
getSrcFile (IBC String
f IFileType
src) = IFileType -> String
getSrcFile IFileType
src
loadFromIFile Bool
_ IBCPhase
_ (IDR String
fn) Maybe Int
maxline = Bool -> String -> Maybe Int -> Idris ()
loadSource' Bool
False String
fn Maybe Int
maxline
loadFromIFile Bool
_ IBCPhase
_ (LIDR String
fn) Maybe Int
maxline = Bool -> String -> Maybe Int -> Idris ()
loadSource' Bool
True String
fn Maybe Int
maxline
loadSource' :: Bool -> FilePath -> Maybe Int -> Idris ()
loadSource' :: Bool -> String -> Maybe Int -> Idris ()
loadSource' Bool
lidr String
r Maybe Int
maxline
= Idris () -> (Err -> Idris ()) -> Idris ()
forall a. Idris a -> (Err -> Idris a) -> Idris a
idrisCatch (Bool -> String -> Maybe Int -> Idris ()
loadSource Bool
lidr String
r Maybe Int
maxline)
(\Err
e -> do FC -> Idris ()
setErrSpan (Err -> FC
getErrSpan Err
e)
IState
ist <- Idris IState
getIState
case Err
e of
At FC
f Err
e' -> FC -> OutputDoc -> Idris ()
iWarn FC
f (IState -> Err -> OutputDoc
pprintErr IState
ist Err
e')
Err
_ -> FC -> OutputDoc -> Idris ()
iWarn (Err -> FC
getErrSpan Err
e) (IState -> Err -> OutputDoc
pprintErr IState
ist Err
e))
loadSource :: Bool -> FilePath -> Maybe Int -> Idris ()
loadSource :: Bool -> String -> Maybe Int -> Idris ()
loadSource Bool
lidr String
f Maybe Int
toline
= do Int -> String -> Idris ()
logParser Int
1 (String
"Reading " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
f)
Int -> String -> Idris ()
iReport Int
2 (String
"Reading " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
f)
IState
i <- Idris IState
getIState
let def_total :: DefaultTotality
def_total = IState -> DefaultTotality
default_total IState
i
String
file_in <- IO String -> Idris String
forall a. IO a -> Idris a
runIO (IO String -> Idris String) -> IO String -> Idris String
forall a b. (a -> b) -> a -> b
$ String -> IO String
readSource String
f
String
file <- if Bool
lidr then TC String -> Idris String
forall a. TC a -> Idris a
tclift (TC String -> Idris String) -> TC String -> Idris String
forall a b. (a -> b) -> a -> b
$ String -> String -> TC String
unlit String
f String
file_in else String -> Idris String
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return String
file_in
(Maybe (Docstring ())
mdocs, [String]
mname, [ImportInfo]
imports_in, Maybe Mark
pos) <- String
-> String
-> Idris (Maybe (Docstring ()), [String], [ImportInfo], Maybe Mark)
parseImports String
f String
file
[String]
ai <- Idris [String]
getAutoImports
let imports :: [ImportInfo]
imports = (String -> ImportInfo) -> [String] -> [ImportInfo]
forall a b. (a -> b) -> [a] -> [b]
map (\String
n -> Bool
-> String -> Maybe (String, FC) -> [Text] -> FC -> FC -> ImportInfo
ImportInfo Bool
True String
n Maybe (String, FC)
forall a. Maybe a
Nothing [] FC
NoFC FC
NoFC) [String]
ai [ImportInfo] -> [ImportInfo] -> [ImportInfo]
forall a. [a] -> [a] -> [a]
++ [ImportInfo]
imports_in
[String]
ids <- String -> Idris [String]
rankedImportDirs String
f
String
ibcsd <- IState -> Idris String
valIBCSubDir IState
i
let ibc :: String
ibc = String -> String -> String
ibcPathNoFallback String
ibcsd String
f
[(String, Int)]
impHashes <- Idris [(String, Int)]
-> (Err -> Idris [(String, Int)]) -> Idris [(String, Int)]
forall a. Idris a -> (Err -> Idris a) -> Idris a
idrisCatch (String -> Idris [(String, Int)]
getImportHashes String
ibc)
(\Err
err -> [(String, Int)] -> Idris [(String, Int)]
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return [])
[Maybe (String, Int)]
newHashes <- ((Bool, String, [Text], FC)
-> StateT IState (ExceptT Err IO) (Maybe (String, Int)))
-> [(Bool, String, [Text], FC)]
-> StateT IState (ExceptT Err IO) [Maybe (String, Int)]
forall (t :: * -> *) (m :: * -> *) a b.
(Traversable t, Monad m) =>
(a -> m b) -> t a -> m (t b)
forall (m :: * -> *) a b. Monad m => (a -> m b) -> [a] -> m [b]
mapM (\ (Bool
_, String
f, [Text]
_, FC
_) ->
do IFileType
fp <- [String] -> String -> String -> Idris IFileType
findImport [String]
ids String
ibcsd String
f
case IFileType
fp of
IBC String
fn IFileType
src ->
StateT IState (ExceptT Err IO) (Maybe (String, Int))
-> (Err -> StateT IState (ExceptT Err IO) (Maybe (String, Int)))
-> StateT IState (ExceptT Err IO) (Maybe (String, Int))
forall a. Idris a -> (Err -> Idris a) -> Idris a
idrisCatch (do Int
hash <- String -> Idris Int
getIBCHash String
fn
Maybe (String, Int)
-> StateT IState (ExceptT Err IO) (Maybe (String, Int))
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return ((String, Int) -> Maybe (String, Int)
forall a. a -> Maybe a
Just (String
fn, Int
hash)))
(\Err
err -> Maybe (String, Int)
-> StateT IState (ExceptT Err IO) (Maybe (String, Int))
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe (String, Int)
forall a. Maybe a
Nothing)
IFileType
_ -> Maybe (String, Int)
-> StateT IState (ExceptT Err IO) (Maybe (String, Int))
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe (String, Int)
forall a. Maybe a
Nothing)
[(Bool
re, String
fn, [Text]
ns, FC
nfc) | ImportInfo Bool
re String
fn Maybe (String, FC)
_ [Text]
ns FC
_ FC
nfc <- [ImportInfo]
imports]
UTCTime
fmod <- IO UTCTime -> StateT IState (ExceptT Err IO) UTCTime
forall a. IO a -> Idris a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO UTCTime -> StateT IState (ExceptT Err IO) UTCTime)
-> IO UTCTime -> StateT IState (ExceptT Err IO) UTCTime
forall a b. (a -> b) -> a -> b
$ String -> IO UTCTime
Dir.getModificationTime String
f
Bool
ibcexists <- IO Bool -> StateT IState (ExceptT Err IO) Bool
forall a. IO a -> Idris a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Bool -> StateT IState (ExceptT Err IO) Bool)
-> IO Bool -> StateT IState (ExceptT Err IO) Bool
forall a b. (a -> b) -> a -> b
$ String -> IO Bool
Dir.doesFileExist String
ibc
UTCTime
ibcmod <- if Bool
ibcexists
then IO UTCTime -> StateT IState (ExceptT Err IO) UTCTime
forall a. IO a -> Idris a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO UTCTime -> StateT IState (ExceptT Err IO) UTCTime)
-> IO UTCTime -> StateT IState (ExceptT Err IO) UTCTime
forall a b. (a -> b) -> a -> b
$ String -> IO UTCTime
Dir.getModificationTime String
ibc
else UTCTime -> StateT IState (ExceptT Err IO) UTCTime
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return UTCTime
fmod
Int -> String -> Idris ()
logParser Int
10 (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
ibc String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
" " String -> String -> String
forall a. [a] -> [a] -> [a]
++ UTCTime -> String
forall a. Show a => a -> String
show UTCTime
ibcmod
Int -> String -> Idris ()
logParser Int
10 (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
f String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
" " String -> String -> String
forall a. [a] -> [a] -> [a]
++ UTCTime -> String
forall a. Show a => a -> String
show UTCTime
fmod
Int -> String -> Idris ()
logParser Int
10 (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ [(String, Int)] -> String
forall a. Show a => a -> String
show [(String, Int)]
impHashes String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
"\n" String -> String -> String
forall a. [a] -> [a] -> [a]
++ [Maybe (String, Int)] -> String
forall a. Show a => a -> String
show [Maybe (String, Int)]
newHashes
let needLoad :: Bool
needLoad = (UTCTime
ibcmod UTCTime -> UTCTime -> Bool
forall a. Ord a => a -> a -> Bool
<= UTCTime
fmod) Bool -> Bool -> Bool
||
([(String, Int)] -> [(String, Int)]
forall a. Ord a => [a] -> [a]
sort [(String, Int)]
impHashes [(String, Int)] -> [(String, Int)] -> Bool
forall a. Eq a => a -> a -> Bool
/= [(String, Int)] -> [(String, Int)]
forall a. Ord a => [a] -> [a]
sort ((Maybe (String, Int) -> Maybe (String, Int))
-> [Maybe (String, Int)] -> [(String, Int)]
forall a b. (a -> Maybe b) -> [a] -> [b]
mapMaybe Maybe (String, Int) -> Maybe (String, Int)
forall a. a -> a
id [Maybe (String, Int)]
newHashes))
if Bool -> Bool
not Bool
needLoad
then () -> Idris ()
forall a. a -> StateT IState (ExceptT Err IO) a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ()
else do
Int -> String -> Idris ()
iReport Int
1 (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
"Type checking " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
f
((Bool, String, [Text], FC) -> Idris ())
-> [(Bool, String, [Text], FC)] -> Idris ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (\ (Bool
re, String
f, [Text]
ns, FC
nfc) ->
do IFileType
fp <- [String] -> String -> String -> Idris IFileType
findImport [String]
ids String
ibcsd String
f
case IFileType
fp of
LIDR String
fn -> String -> Idris ()
forall a. String -> Idris a
ifail (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
"No ibc for " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
f
IDR String
fn -> String -> Idris ()
forall a. String -> Idris a
ifail (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
"No ibc for " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
f
IBC String
fn IFileType
src ->
do Bool -> IBCPhase -> String -> Idris ()
loadIBC Bool
True IBCPhase
IBC_Building String
fn
let srcFn :: Maybe String
srcFn = case IFileType
src of
IDR String
fn -> String -> Maybe String
forall a. a -> Maybe a
Just String
fn
LIDR String
fn -> String -> Maybe String
forall a. a -> Maybe a
Just String
fn
IFileType
_ -> Maybe String
forall a. Maybe a
Nothing
Maybe String
srcFnAbs <- case Maybe String
srcFn of
Just String
fn -> (String -> Maybe String) -> Idris String -> Idris (Maybe String)
forall a b.
(a -> b)
-> StateT IState (ExceptT Err IO) a
-> StateT IState (ExceptT Err IO) b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap String -> Maybe String
forall a. a -> Maybe a
Just (IO String -> Idris String
forall a. IO a -> Idris a
runIO (IO String -> Idris String) -> IO String -> Idris String
forall a b. (a -> b) -> a -> b
$ String -> IO String
Dir.makeAbsolute String
fn)
Maybe String
Nothing -> Maybe String -> Idris (Maybe String)
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe String
forall a. Maybe a
Nothing
Set (FC', OutputAnnotation) -> Idris ()
sendHighlighting (Set (FC', OutputAnnotation) -> Idris ())
-> Set (FC', OutputAnnotation) -> Idris ()
forall a b. (a -> b) -> a -> b
$ [(FC', OutputAnnotation)] -> Set (FC', OutputAnnotation)
forall a. Ord a => [a] -> Set a
S.fromList [(FC -> FC'
FC' FC
nfc, [Text] -> Maybe String -> OutputAnnotation
AnnNamespace [Text]
ns Maybe String
srcFnAbs)])
[(Bool
re, String
fn, [Text]
ns, FC
nfc) | ImportInfo Bool
re String
fn Maybe (String, FC)
_ [Text]
ns FC
_ FC
nfc <- [ImportInfo]
imports]
Idris ()
reportParserWarnings
Idris ()
sendParserHighlighting
let modAliases :: Map [Text] [Text]
modAliases = [([Text], [Text])] -> Map [Text] [Text]
forall k a. Ord k => [(k, a)] -> Map k a
M.fromList
[ (String -> [Text]
prep String
alias, String -> [Text]
prep String
realName)
| ImportInfo { import_reexport :: ImportInfo -> Bool
import_reexport = Bool
reexport
, import_path :: ImportInfo -> String
import_path = String
realName
, import_rename :: ImportInfo -> Maybe (String, FC)
import_rename = Just (String
alias, FC
_)
, import_location :: ImportInfo -> FC
import_location = FC
fc } <- [ImportInfo]
imports
]
prep :: String -> [Text]
prep = (String -> Text) -> [String] -> [Text]
forall a b. (a -> b) -> [a] -> [b]
map String -> Text
T.pack ([String] -> [Text]) -> (String -> [String]) -> String -> [Text]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [String] -> [String]
forall a. [a] -> [a]
reverse ([String] -> [String])
-> (String -> [String]) -> String -> [String]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> String -> [String]
forall a. Eq a => [a] -> [a] -> [[a]]
Spl.splitOn [Char
pathSeparator]
aliasNames :: [(String, FC)]
aliasNames = [ (String
alias, FC
fc)
| ImportInfo { import_rename :: ImportInfo -> Maybe (String, FC)
import_rename = Just (String
alias, FC
fc)
} <- [ImportInfo]
imports
]
histogram :: [[(String, FC)]]
histogram = ((String, FC) -> (String, FC) -> Bool)
-> [(String, FC)] -> [[(String, FC)]]
forall a. (a -> a -> Bool) -> [a] -> [[a]]
groupBy (String -> String -> Bool
forall a. Eq a => a -> a -> Bool
(==) (String -> String -> Bool)
-> ((String, FC) -> String) -> (String, FC) -> (String, FC) -> Bool
forall b c a. (b -> b -> c) -> (a -> b) -> a -> a -> c
`on` (String, FC) -> String
forall a b. (a, b) -> a
fst) ([(String, FC)] -> [[(String, FC)]])
-> ([(String, FC)] -> [(String, FC)])
-> [(String, FC)]
-> [[(String, FC)]]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ((String, FC) -> (String, FC) -> Ordering)
-> [(String, FC)] -> [(String, FC)]
forall a. (a -> a -> Ordering) -> [a] -> [a]
sortBy (((String, FC) -> String)
-> (String, FC) -> (String, FC) -> Ordering
forall a b. Ord a => (b -> a) -> b -> b -> Ordering
comparing (String, FC) -> String
forall a b. (a, b) -> a
fst) ([(String, FC)] -> [[(String, FC)]])
-> [(String, FC)] -> [[(String, FC)]]
forall a b. (a -> b) -> a -> b
$ [(String, FC)]
aliasNames
case ([(String, FC)] -> (String, FC))
-> [[(String, FC)]] -> [(String, FC)]
forall a b. (a -> b) -> [a] -> [b]
map [(String, FC)] -> (String, FC)
forall a. HasCallStack => [a] -> a
head ([[(String, FC)]] -> [(String, FC)])
-> ([[(String, FC)]] -> [[(String, FC)]])
-> [[(String, FC)]]
-> [(String, FC)]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ([(String, FC)] -> Bool) -> [[(String, FC)]] -> [[(String, FC)]]
forall a. (a -> Bool) -> [a] -> [a]
filter ((Int -> Int -> Bool
forall a. Eq a => a -> a -> Bool
/= Int
1) (Int -> Bool) -> ([(String, FC)] -> Int) -> [(String, FC)] -> Bool
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [(String, FC)] -> Int
forall a. [a] -> Int
forall (t :: * -> *) a. Foldable t => t a -> Int
length) ([[(String, FC)]] -> [(String, FC)])
-> [[(String, FC)]] -> [(String, FC)]
forall a b. (a -> b) -> a -> b
$ [[(String, FC)]]
histogram of
[] -> Int -> String -> Idris ()
logParser Int
3 (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
"Module aliases: " String -> String -> String
forall a. [a] -> [a] -> [a]
++ [([Text], [Text])] -> String
forall a. Show a => a -> String
show (Map [Text] [Text] -> [([Text], [Text])]
forall k a. Map k a -> [(k, a)]
M.toList Map [Text] [Text]
modAliases)
(String
n,FC
fc):[(String, FC)]
_ -> Err -> Idris ()
forall a. Err -> Idris a
throwError (Err -> Idris ()) -> (String -> Err) -> String -> Idris ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FC -> Err -> Err
forall t. FC -> Err' t -> Err' t
At FC
fc (Err -> Err) -> (String -> Err) -> String -> Err
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Err
forall t. String -> Err' t
Msg (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
"import alias not unique: " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String -> String
forall a. Show a => a -> String
show String
n
IState
i <- Idris IState
getIState
IState -> Idris ()
putIState (IState
i { default_access = Private, module_aliases = modAliases })
Idris ()
clearIBC
(IBCWrite -> Idris ()) -> [IBCWrite] -> Idris ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ IBCWrite -> Idris ()
addIBC (((String, Int) -> IBCWrite) -> [(String, Int)] -> [IBCWrite]
forall a b. (a -> b) -> [a] -> [b]
map (\ (String
f, Int
h) -> String -> Int -> IBCWrite
IBCImportHash String
f Int
h)
((Maybe (String, Int) -> Maybe (String, Int))
-> [Maybe (String, Int)] -> [(String, Int)]
forall a b. (a -> Maybe b) -> [a] -> [b]
mapMaybe Maybe (String, Int) -> Maybe (String, Int)
forall a. a -> a
id [Maybe (String, Int)]
newHashes))
[String]
imps <- Idris [String]
allImportDirs
(IBCWrite -> Idris ()) -> [IBCWrite] -> Idris ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ IBCWrite -> Idris ()
addIBC ((String -> IBCWrite) -> [String] -> [IBCWrite]
forall a b. (a -> b) -> [a] -> [b]
map String -> IBCWrite
IBCImportDir [String]
imps)
((Bool, String) -> Idris ()) -> [(Bool, String)] -> Idris ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (IBCWrite -> Idris ()
addIBC (IBCWrite -> Idris ())
-> ((Bool, String) -> IBCWrite) -> (Bool, String) -> Idris ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (Bool, String) -> IBCWrite
IBCImport)
[ (Bool
reexport, String
realName)
| ImportInfo { import_reexport :: ImportInfo -> Bool
import_reexport = Bool
reexport
, import_path :: ImportInfo -> String
import_path = String
realName
} <- [ImportInfo]
imports
]
let syntax :: SyntaxInfo
syntax = SyntaxInfo
defaultSyntax{ syn_namespace = reverse mname,
maxline = toline }
IState
ist <- Idris IState
getIState
let oldSpan :: Maybe FC
oldSpan = IState -> Maybe FC
idris_parsedSpan IState
ist
[PDecl]
ds' <- SyntaxInfo -> String -> String -> Maybe Mark -> Idris [PDecl]
parseProg SyntaxInfo
syntax String
f String
file Maybe Mark
pos
case ([PDecl]
ds', Maybe FC
oldSpan) of
([], Just FC
fc) ->
do IState
ist <- Idris IState
getIState
IState -> Idris ()
putIState IState
ist { idris_parsedSpan = oldSpan
, ibc_write = IBCParsedRegion fc :
ibc_write ist
}
([PDecl], Maybe FC)
_ -> () -> Idris ()
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
Idris ()
sendParserHighlighting
let ds :: [PDecl]
ds = [String] -> [PDecl] -> [PDecl]
namespaces [String]
mname [PDecl]
ds'
Int -> String -> Idris ()
logParser Int
3 (OutputDoc -> String
forall a. Show a => a -> String
show (OutputDoc -> String) -> OutputDoc -> String
forall a b. (a -> b) -> a -> b
$ PPOption -> [PDecl] -> OutputDoc
showDecls PPOption
verbosePPOption [PDecl]
ds)
IState
i <- Idris IState
getIState
Int -> String -> Idris ()
logLvl Int
10 ([(Name, [PArg])] -> String
forall a. Show a => a -> String
show (Ctxt [PArg] -> [(Name, [PArg])]
forall a. Ctxt a -> [(Name, a)]
toAlist (IState -> Ctxt [PArg]
idris_implicits IState
i)))
Int -> String -> Idris ()
logLvl Int
3 ([FixDecl] -> String
forall a. Show a => a -> String
show (IState -> [FixDecl]
idris_infixes IState
i))
ElabInfo -> [PDecl] -> Idris ()
elabDecls (String -> ElabInfo
toplevelWith String
f) ((PDecl -> PDecl) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> [a] -> [b]
map PDecl -> PDecl
toMutual [PDecl]
ds)
IState
i <- Idris IState
getIState
(Name -> Idris ()) -> [Name] -> Idris ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (\Name
n -> do Int -> String -> Idris ()
logLvl Int
5 (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
"Simplifying " String -> String -> String
forall a. [a] -> [a] -> [a]
++ Name -> String
forall a. Show a => a -> String
show Name
n
Context
ctxt' <-
do Context
ctxt <- StateT IState (ExceptT Err IO) Context
getContext
TC Context -> StateT IState (ExceptT Err IO) Context
forall a. TC a -> Idris a
tclift (TC Context -> StateT IState (ExceptT Err IO) Context)
-> TC Context -> StateT IState (ExceptT Err IO) Context
forall a b. (a -> b) -> a -> b
$ Name -> [Name] -> [[Name]] -> ErasureInfo -> Context -> TC Context
simplifyCasedef Name
n [] [] (IState -> ErasureInfo
getErasureInfo IState
i) Context
ctxt
Context -> Idris ()
setContext Context
ctxt')
(((FC, Name) -> Name) -> [(FC, Name)] -> [Name]
forall a b. (a -> b) -> [a] -> [b]
map (FC, Name) -> Name
forall a b. (a, b) -> b
snd (IState -> [(FC, Name)]
idris_totcheck IState
i))
Int -> String -> Idris ()
iReport Int
3 (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
"Totality checking " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
f
Int -> String -> Idris ()
logLvl Int
1 (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
"Totality checking " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
f
IState
i <- Idris IState
getIState
((FC, Name) -> Idris ()) -> [(FC, Name)] -> Idris ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (FC, Name) -> Idris ()
buildSCG (IState -> [(FC, Name)]
idris_totcheck IState
i)
((FC, Name) -> StateT IState (ExceptT Err IO) Totality)
-> [(FC, Name)] -> Idris ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (FC, Name) -> StateT IState (ExceptT Err IO) Totality
checkDeclTotality (IState -> [(FC, Name)]
idris_totcheck IState
i)
((FC, Name) -> Idris ()) -> [(FC, Name)] -> Idris ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (FC, Name) -> Idris ()
verifyTotality (IState -> [(FC, Name)]
idris_totcheck IState
i)
let deftots :: [(FC, Name)]
deftots = IState -> [(FC, Name)]
idris_defertotcheck IState
i
Int -> String -> Idris ()
logLvl Int
2 (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
"Totality checking " String -> String -> String
forall a. [a] -> [a] -> [a]
++ [(FC, Name)] -> String
forall a. Show a => a -> String
show [(FC, Name)]
deftots
(Name -> Idris ()) -> [Name] -> Idris ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (\Name
x -> do Totality
tot <- Name -> StateT IState (ExceptT Err IO) Totality
getTotality Name
x
case Totality
tot of
Total [Int]
_ ->
do let opts :: FnOpts
opts = case Name -> Ctxt FnOpts -> Maybe FnOpts
forall a. Name -> Ctxt a -> Maybe a
lookupCtxtExact Name
x (IState -> Ctxt FnOpts
idris_flags IState
i) of
Just FnOpts
os -> FnOpts
os
Maybe FnOpts
Nothing -> []
Bool -> Idris () -> Idris ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (FnOpt
AssertTotal FnOpt -> FnOpts -> Bool
forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
`notElem` FnOpts
opts) (Idris () -> Idris ()) -> Idris () -> Idris ()
forall a b. (a -> b) -> a -> b
$
Name -> Totality -> Idris ()
setTotality Name
x Totality
Unchecked
Totality
_ -> () -> Idris ()
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return ()) (((FC, Name) -> Name) -> [(FC, Name)] -> [Name]
forall a b. (a -> b) -> [a] -> [b]
map (FC, Name) -> Name
forall a b. (a, b) -> b
snd [(FC, Name)]
deftots)
((FC, Name) -> Idris ()) -> [(FC, Name)] -> Idris ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (FC, Name) -> Idris ()
buildSCG [(FC, Name)]
deftots
((FC, Name) -> StateT IState (ExceptT Err IO) Totality)
-> [(FC, Name)] -> Idris ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (FC, Name) -> StateT IState (ExceptT Err IO) Totality
checkDeclTotality [(FC, Name)]
deftots
Int -> String -> Idris ()
logLvl Int
1 (String
"Finished " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
f)
String
ibcsd <- IState -> Idris String
valIBCSubDir IState
i
Int -> String -> Idris ()
logLvl Int
1 (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
"Universe checking " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
f
Int -> String -> Idris ()
iReport Int
3 (String -> Idris ()) -> String -> Idris ()
forall a b. (a -> b) -> a -> b
$ String
"Universe checking " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
f
Idris ()
iucheck
IState
i <- Idris IState
getIState
Ctxt Accessibility -> Idris ()
addHides (IState -> Ctxt Accessibility
hide_list IState
i)
IState
i <- Idris IState
getIState
case Maybe (Docstring ())
mdocs of
Maybe (Docstring ())
Nothing -> () -> Idris ()
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
Just Docstring ()
docs -> SyntaxInfo -> [String] -> Docstring () -> Idris ()
addModDoc SyntaxInfo
syntax [String]
mname Docstring ()
docs
Bool
ok <- StateT IState (ExceptT Err IO) Bool
noErrors
Bool -> Idris () -> Idris ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when Bool
ok (Idris () -> Idris ()) -> Idris () -> Idris ()
forall a b. (a -> b) -> a -> b
$
do Idris () -> (Err -> Idris ()) -> Idris ()
forall a. Idris a -> (Err -> Idris a) -> Idris a
idrisCatch (do String -> String -> Idris ()
writeIBC String
f String
ibc; Idris ()
clearIBC)
(\Err
c -> () -> Idris ()
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return ())
Bool
hl <- StateT IState (ExceptT Err IO) Bool
getDumpHighlighting
Bool -> Idris () -> Idris ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when Bool
hl (Idris () -> Idris ()) -> Idris () -> Idris ()
forall a b. (a -> b) -> a -> b
$
Idris () -> (Err -> Idris ()) -> Idris ()
forall a. Idris a -> (Err -> Idris a) -> Idris a
idrisCatch (String -> Idris ()
writeHighlights String
f)
(Idris () -> Err -> Idris ()
forall a b. a -> b -> a
const (Idris () -> Err -> Idris ()) -> Idris () -> Err -> Idris ()
forall a b. (a -> b) -> a -> b
$ () -> Idris ()
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return ())
Idris ()
clearHighlights
IState
i <- Idris IState
getIState
IState -> Idris ()
putIState (IState
i { default_total = def_total,
hide_list = emptyContext })
() -> Idris ()
forall a. a -> StateT IState (ExceptT Err IO) a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
where
namespaces :: [String] -> [PDecl] -> [PDecl]
namespaces :: [String] -> [PDecl] -> [PDecl]
namespaces [] [PDecl]
ds = [PDecl]
ds
namespaces (String
x:[String]
xs) [PDecl]
ds = [String -> FC -> [PDecl] -> PDecl
forall t. String -> FC -> [PDecl' t] -> PDecl' t
PNamespace String
x FC
NoFC ([String] -> [PDecl] -> [PDecl]
namespaces [String]
xs [PDecl]
ds)]
toMutual :: PDecl -> PDecl
toMutual :: PDecl -> PDecl
toMutual m :: PDecl
m@(PMutual FC
_ [PDecl]
d) = PDecl
m
toMutual (PNamespace String
x FC
fc [PDecl]
ds) = String -> FC -> [PDecl] -> PDecl
forall t. String -> FC -> [PDecl' t] -> PDecl' t
PNamespace String
x FC
fc ((PDecl -> PDecl) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> [a] -> [b]
map PDecl -> PDecl
toMutual [PDecl]
ds)
toMutual (POpenInterfaces FC
f [Name]
ns [PDecl]
ds) = FC -> [Name] -> [PDecl] -> PDecl
forall t. FC -> [Name] -> [PDecl' t] -> PDecl' t
POpenInterfaces FC
f [Name]
ns ((PDecl -> PDecl) -> [PDecl] -> [PDecl]
forall a b. (a -> b) -> [a] -> [b]
map PDecl -> PDecl
toMutual [PDecl]
ds)
toMutual PDecl
x = let r :: PDecl
r = FC -> [PDecl] -> PDecl
forall t. FC -> [PDecl' t] -> PDecl' t
PMutual (String -> FC
fileFC String
"single mutual") [PDecl
x] in
case PDecl
x of
PClauses{} -> PDecl
r
PInterface{} -> PDecl
r
PData{} -> PDecl
r
PImplementation{} -> PDecl
r
PDecl
_ -> PDecl
x
addModDoc :: SyntaxInfo -> [String] -> Docstring () -> Idris ()
addModDoc :: SyntaxInfo -> [String] -> Docstring () -> Idris ()
addModDoc SyntaxInfo
syn [String]
mname Docstring ()
docs =
do IState
ist <- Idris IState
getIState
Docstring DocTerm
docs' <- ElabInfo
-> Docstring (Either Err PTerm) -> Idris (Docstring DocTerm)
elabDocTerms (String -> ElabInfo
toplevelWith String
f) (IState -> Docstring (Either Err PTerm)
parsedDocs IState
ist)
let modDocs' :: Ctxt (Docstring DocTerm)
modDocs' = Name
-> Docstring DocTerm
-> Ctxt (Docstring DocTerm)
-> Ctxt (Docstring DocTerm)
forall a. Name -> a -> Ctxt a -> Ctxt a
addDef Name
docName Docstring DocTerm
docs' (IState -> Ctxt (Docstring DocTerm)
idris_moduledocs IState
ist)
IState -> Idris ()
putIState IState
ist { idris_moduledocs = modDocs' }
IBCWrite -> Idris ()
addIBC (Name -> IBCWrite
IBCModDocs Name
docName)
where
docName :: Name
docName = Name -> [Text] -> Name
NS Name
modDocName ((String -> Text) -> [String] -> [Text]
forall a b. (a -> b) -> [a] -> [b]
map String -> Text
T.pack ([String] -> [String]
forall a. [a] -> [a]
reverse [String]
mname))
parsedDocs :: IState -> Docstring (Either Err PTerm)
parsedDocs IState
ist = (String -> Either Err PTerm)
-> Docstring () -> Docstring (Either Err PTerm)
forall a b. (String -> b) -> Docstring a -> Docstring b
annotCode (SyntaxInfo -> IState -> String -> Either Err PTerm
tryFullExpr SyntaxInfo
syn IState
ist) Docstring ()
docs
addHides :: Ctxt Accessibility -> Idris ()
addHides :: Ctxt Accessibility -> Idris ()
addHides Ctxt Accessibility
xs = ((Name, Accessibility) -> Idris ())
-> [(Name, Accessibility)] -> Idris ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (Name, Accessibility) -> Idris ()
doHide (Ctxt Accessibility -> [(Name, Accessibility)]
forall a. Ctxt a -> [(Name, a)]
toAlist Ctxt Accessibility
xs)
where doHide :: (Name, Accessibility) -> Idris ()
doHide (Name
n, Accessibility
a) = do Name -> Accessibility -> Idris ()
setAccessibility Name
n Accessibility
a
IBCWrite -> Idris ()
addIBC (Name -> Accessibility -> IBCWrite
IBCAccess Name
n Accessibility
a)