haskell-src-exts-1.3.5: Manipulating Haskell source: abstract syntax, lexer, parser, and pretty-printerSource codeContentsIndex
Language.Haskell.Exts.Annotated
Portabilityportable
Stabilitystable
MaintainerNiklas Broberg, d00nibro@chalmers.se
Contents
Re-exported modules
Parsing of Haskell source files
Parsing of Haskell source elements,
Read extensions declared in LANGUAGE pragmas
Description
An umbrella module for the various functionality of the package. Also provides some convenient functionality for dealing directly with source files.
Synopsis
module Language.Haskell.Exts.Annotated.Syntax
module Language.Haskell.Exts.Annotated.Build
module Language.Haskell.Exts.Parser
module Language.Haskell.Exts.Pretty
module Language.Haskell.Exts.Annotated.Fixity
module Language.Haskell.Exts.Annotated.ExactPrint
module Language.Haskell.Exts.SrcLoc
module Language.Haskell.Exts.Comments
module Language.Haskell.Exts.Extension
parseFile :: FilePath -> IO (ParseResult (Module SrcSpanInfo))
parseFileWithMode :: ParseMode -> FilePath -> IO (ParseResult (Module SrcSpanInfo))
parseFileWithExts :: [Extension] -> FilePath -> IO (ParseResult (Module SrcSpanInfo))
parseFileWithComments :: ParseMode -> FilePath -> IO (ParseResult (Module SrcSpanInfo, [Comment]))
parseFileContents :: String -> ParseResult (Module SrcSpanInfo)
parseFileContentsWithMode :: ParseMode -> String -> ParseResult (Module SrcSpanInfo)
parseFileContentsWithExts :: [Extension] -> String -> ParseResult (Module SrcSpanInfo)
parseFileContentsWithComments :: ParseMode -> String -> ParseResult (Module SrcSpanInfo, [Comment])
parseModule :: String -> ParseResult (Module SrcSpanInfo)
parseModuleWithMode :: ParseMode -> String -> ParseResult (Module SrcSpanInfo)
parseModuleWithComments :: ParseMode -> String -> ParseResult (Module SrcSpanInfo, [Comment])
parseExp :: String -> ParseResult (Exp SrcSpanInfo)
parseExpWithMode :: ParseMode -> String -> ParseResult (Exp SrcSpanInfo)
parseExpWithComments :: ParseMode -> String -> ParseResult (Exp SrcSpanInfo, [Comment])
parseStmt :: String -> ParseResult (Stmt SrcSpanInfo)
parseStmtWithMode :: ParseMode -> String -> ParseResult (Stmt SrcSpanInfo)
parseStmtWithComments :: ParseMode -> String -> ParseResult (Stmt SrcSpanInfo, [Comment])
parsePat :: String -> ParseResult (Pat SrcSpanInfo)
parsePatWithMode :: ParseMode -> String -> ParseResult (Pat SrcSpanInfo)
parsePatWithComments :: ParseMode -> String -> ParseResult (Pat SrcSpanInfo, [Comment])
parseDecl :: String -> ParseResult (Decl SrcSpanInfo)
parseDeclWithMode :: ParseMode -> String -> ParseResult (Decl SrcSpanInfo)
parseDeclWithComments :: ParseMode -> String -> ParseResult (Decl SrcSpanInfo, [Comment])
parseType :: String -> ParseResult (Type SrcSpanInfo)
parseTypeWithMode :: ParseMode -> String -> ParseResult (Type SrcSpanInfo)
parseTypeWithComments :: ParseMode -> String -> ParseResult (Type SrcSpanInfo, [Comment])
readExtensions :: String -> Maybe [Extension]
Re-exported modules
module Language.Haskell.Exts.Annotated.Syntax
module Language.Haskell.Exts.Annotated.Build
module Language.Haskell.Exts.Parser
module Language.Haskell.Exts.Pretty
module Language.Haskell.Exts.Annotated.Fixity
module Language.Haskell.Exts.Annotated.ExactPrint
module Language.Haskell.Exts.SrcLoc
module Language.Haskell.Exts.Comments
module Language.Haskell.Exts.Extension
Parsing of Haskell source files
parseFile :: FilePath -> IO (ParseResult (Module SrcSpanInfo))Source
Parse a source file on disk, using the default parse mode.
parseFileWithMode :: ParseMode -> FilePath -> IO (ParseResult (Module SrcSpanInfo))Source
Parse a source file on disk, supplying a custom parse mode.
parseFileWithExts :: [Extension] -> FilePath -> IO (ParseResult (Module SrcSpanInfo))Source
Parse a source file on disk, with an extra set of extensions to know about on top of what the file itself declares.
parseFileWithComments :: ParseMode -> FilePath -> IO (ParseResult (Module SrcSpanInfo, [Comment]))Source
parseFileContents :: String -> ParseResult (Module SrcSpanInfo)Source
Parse a source file from a string using the default parse mode.
parseFileContentsWithMode :: ParseMode -> String -> ParseResult (Module SrcSpanInfo)Source
Parse a source file from a string using a custom parse mode.
parseFileContentsWithExts :: [Extension] -> String -> ParseResult (Module SrcSpanInfo)Source
Parse a source file from a string, with an extra set of extensions to know about on top of what the file itself declares.
parseFileContentsWithComments :: ParseMode -> String -> ParseResult (Module SrcSpanInfo, [Comment])Source
Parsing of Haskell source elements,
parseModule :: String -> ParseResult (Module SrcSpanInfo)Source
Parse of a string, which should contain a complete Haskell module.
parseModuleWithMode :: ParseMode -> String -> ParseResult (Module SrcSpanInfo)Source
Parse of a string containing a complete Haskell module, using an explicit mode.
parseModuleWithComments :: ParseMode -> String -> ParseResult (Module SrcSpanInfo, [Comment])Source
Parse of a string containing a complete Haskell module, using an explicit mode, retaining comments.
parseExp :: String -> ParseResult (Exp SrcSpanInfo)Source
Parse of a string containing a Haskell expression.
parseExpWithMode :: ParseMode -> String -> ParseResult (Exp SrcSpanInfo)Source
Parse of a string containing a Haskell expression, using an explicit mode.
parseExpWithComments :: ParseMode -> String -> ParseResult (Exp SrcSpanInfo, [Comment])Source
Parse of a string containing a complete Haskell module, using an explicit mode, retaining comments.
parseStmt :: String -> ParseResult (Stmt SrcSpanInfo)Source
Parse of a string containing a Haskell statement.
parseStmtWithMode :: ParseMode -> String -> ParseResult (Stmt SrcSpanInfo)Source
Parse of a string containing a Haskell type, using an explicit mode.
parseStmtWithComments :: ParseMode -> String -> ParseResult (Stmt SrcSpanInfo, [Comment])Source
Parse of a string containing a complete Haskell module, using an explicit mode, retaining comments.
parsePat :: String -> ParseResult (Pat SrcSpanInfo)Source
Parse of a string containing a Haskell pattern.
parsePatWithMode :: ParseMode -> String -> ParseResult (Pat SrcSpanInfo)Source
Parse of a string containing a Haskell pattern, using an explicit mode.
parsePatWithComments :: ParseMode -> String -> ParseResult (Pat SrcSpanInfo, [Comment])Source
Parse of a string containing a complete Haskell module, using an explicit mode, retaining comments.
parseDecl :: String -> ParseResult (Decl SrcSpanInfo)Source
Parse of a string containing a Haskell top-level declaration.
parseDeclWithMode :: ParseMode -> String -> ParseResult (Decl SrcSpanInfo)Source
Parse of a string containing a Haskell top-level declaration, using an explicit mode.
parseDeclWithComments :: ParseMode -> String -> ParseResult (Decl SrcSpanInfo, [Comment])Source
Parse of a string containing a complete Haskell module, using an explicit mode, retaining comments.
parseType :: String -> ParseResult (Type SrcSpanInfo)Source
Parse of a string containing a Haskell type.
parseTypeWithMode :: ParseMode -> String -> ParseResult (Type SrcSpanInfo)Source
Parse of a string containing a Haskell type, using an explicit mode.
parseTypeWithComments :: ParseMode -> String -> ParseResult (Type SrcSpanInfo, [Comment])Source
Parse of a string containing a complete Haskell module, using an explicit mode, retaining comments.
Read extensions declared in LANGUAGE pragmas
readExtensions :: String -> Maybe [Extension]Source
Gather the extensions declared in LANGUAGE pragmas at the top of the file. Returns Nothing if the parse of the pragmas fails.
Produced by Haddock version 2.6.0