Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- preload :: (MonadIO m, MonadCatch m) => Text -> [(String, String)] -> [String] -> Maybe Text -> InspectM ModuleLocation ModuleTag m Preloaded
- data AnalyzeEnv = AnalyzeEnv {}
- analyzeEnv :: Lens' AnalyzeEnv Environment
- analyzeFixities :: Lens' AnalyzeEnv (Map Name Fixity)
- analyzeRefine :: Lens' AnalyzeEnv RefineTable
- moduleAnalyzeEnv :: Module -> AnalyzeEnv
- analyzeResolve :: AnalyzeEnv -> Module -> Module
- analyzePreloaded :: AnalyzeEnv -> Preloaded -> Either String Module
- inspectDocs :: [String] -> Module -> GhcM Module
- inspectDocsGhc :: [String] -> Module -> GhcM Module
- inspectContents :: Text -> [(String, String)] -> [String] -> Text -> IO InspectedModule
- contentsInspection :: Text -> [String] -> IO Inspection
- inspectFile :: [(String, String)] -> [String] -> Path -> Maybe Project -> Maybe Text -> IO InspectedModule
- sourceInspection :: Path -> Maybe Text -> [String] -> IO Inspection
- fileMTime :: Path -> IO POSIXTime
- fileInspection :: Path -> [String] -> IO Inspection
- fileContentsInspection :: [String] -> IO Inspection
- fileContentsInspection_ :: [String] -> POSIXTime -> Inspection
- installedInspection :: [String] -> IO Inspection
- moduleInspection :: ModuleLocation -> [String] -> IO Inspection
- projectDirs :: Project -> IO [Extensions Path]
- projectSources :: Project -> IO [Extensions Path]
- getDefines :: IO [(String, String)]
- preprocess :: [(String, String)] -> Path -> Text -> IO Text
- preprocess_ :: [(String, String)] -> [String] -> Path -> Text -> IO Text
- module HsDev.Inspect.Types
- module HsDev.Inspect.Resolve
- module Control.Monad.Except
Documentation
preload :: (MonadIO m, MonadCatch m) => Text -> [(String, String)] -> [String] -> Maybe Text -> InspectM ModuleLocation ModuleTag m Preloaded Source #
Preload module - load head and imports to get actual extensions and dependencies
data AnalyzeEnv Source #
Instances
Semigroup AnalyzeEnv Source # | |
Defined in HsDev.Inspect (<>) :: AnalyzeEnv -> AnalyzeEnv -> AnalyzeEnv # sconcat :: NonEmpty AnalyzeEnv -> AnalyzeEnv # stimes :: Integral b => b -> AnalyzeEnv -> AnalyzeEnv # | |
Monoid AnalyzeEnv Source # | |
Defined in HsDev.Inspect mempty :: AnalyzeEnv # mappend :: AnalyzeEnv -> AnalyzeEnv -> AnalyzeEnv # mconcat :: [AnalyzeEnv] -> AnalyzeEnv # |
moduleAnalyzeEnv :: Module -> AnalyzeEnv Source #
analyzeResolve :: AnalyzeEnv -> Module -> Module Source #
Resolve module importsexportsscope
analyzePreloaded :: AnalyzeEnv -> Preloaded -> Either String Module Source #
Inspect preloaded module
inspectDocs :: [String] -> Module -> GhcM Module Source #
Extract file docs and set them to module declarations
inspectContents :: Text -> [(String, String)] -> [String] -> Text -> IO InspectedModule Source #
Inspect contents
contentsInspection :: Text -> [String] -> IO Inspection Source #
inspectFile :: [(String, String)] -> [String] -> Path -> Maybe Project -> Maybe Text -> IO InspectedModule Source #
Inspect file
sourceInspection :: Path -> Maybe Text -> [String] -> IO Inspection Source #
Source inspection data, differs whether there are contents provided
fileInspection :: Path -> [String] -> IO Inspection Source #
File inspection data
fileContentsInspection :: [String] -> IO Inspection Source #
File contents inspection data
fileContentsInspection_ :: [String] -> POSIXTime -> Inspection Source #
File contents inspection data
installedInspection :: [String] -> IO Inspection Source #
Installed module inspection data, just opts
moduleInspection :: ModuleLocation -> [String] -> IO Inspection Source #
Inspection by module location
projectDirs :: Project -> IO [Extensions Path] Source #
Enumerate project dirs
projectSources :: Project -> IO [Extensions Path] Source #
Enumerate project source files
module HsDev.Inspect.Types
module HsDev.Inspect.Resolve
module Control.Monad.Except