Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Parsing the top of a Haskell source file to get its module name, imports and options.
(c) Simon Marlow 2005 (c) Lemmih 2006
Synopsis
- getImports :: ParserOpts -> Bool -> StringBuffer -> FilePath -> FilePath -> IO (Either (Bag PsError) ([(Maybe FastString, Located ModuleName)], [(Maybe FastString, Located ModuleName)], Located ModuleName))
- mkPrelImports :: ModuleName -> SrcSpan -> Bool -> [LImportDecl GhcPs] -> [LImportDecl GhcPs]
- getOptionsFromFile :: DynFlags -> FilePath -> IO [Located String]
- getOptions :: DynFlags -> StringBuffer -> FilePath -> [Located String]
- optionsErrorMsgs :: [String] -> [Located String] -> FilePath -> Messages DecoratedSDoc
- checkProcessArgsResult :: MonadIO m => [Located String] -> m ()
Documentation
:: ParserOpts | Parser options |
-> Bool | Implicit Prelude? |
-> StringBuffer | Parse this. |
-> FilePath | Filename the buffer came from. Used for reporting parse error locations. |
-> FilePath | The original source filename (used for locations in the function result) |
-> IO (Either (Bag PsError) ([(Maybe FastString, Located ModuleName)], [(Maybe FastString, Located ModuleName)], Located ModuleName)) | The source imports and normal imports (with optional package names from -XPackageImports), and the module name. |
Parse the imports of a source file.
Throws a SourceError
if parsing fails.
mkPrelImports :: ModuleName -> SrcSpan -> Bool -> [LImportDecl GhcPs] -> [LImportDecl GhcPs] Source #
Parse OPTIONS and LANGUAGE pragmas of the source file.
Throws a SourceError
if flag parsing fails (including unsupported flags.)
:: DynFlags | |
-> StringBuffer | Input Buffer |
-> FilePath | Source filename. Used for location info. |
-> [Located String] | Parsed options. |
Parse OPTIONS and LANGUAGE pragmas of the source file.
Throws a SourceError
if flag parsing fails (including unsupported flags.)
optionsErrorMsgs :: [String] -> [Located String] -> FilePath -> Messages DecoratedSDoc Source #
checkProcessArgsResult :: MonadIO m => [Located String] -> m () Source #
Complain about non-dynamic flags in OPTIONS pragmas.
Throws a SourceError
if the input list is non-empty claiming that the
input flags are unknown.