Safe Haskell | None |
---|---|
Language | Haskell98 |
- type CompileFlag = String
- type ModuleToScan = (ModuleLocation, [CompileFlag], Maybe Text)
- type ProjectToScan = (Project, [ModuleToScan])
- type PackageDbToScan = PackageDbStack
- data ScanContents = ScanContents {}
- class EnumContents a where
- enumRescan :: CommandMonad m => FilePath -> m ScanContents
- enumDependent :: CommandMonad m => FilePath -> m ScanContents
- enumProject :: CommandMonad m => Project -> m ScanContents
- enumSandbox :: CommandMonad m => Sandbox -> m ScanContents
- enumDirectory :: CommandMonad m => FilePath -> m ScanContents
- scanProjectFile :: CommandMonad m => [String] -> Path -> m Project
- scanModify :: CommandMonad m => ([String] -> Module -> m Module) -> InspectedModule -> m InspectedModule
- upToDate :: SessionMonad m => ModuleLocation -> [String] -> Inspection -> m Bool
- changedModules :: SessionMonad m => Map ModuleLocation Inspection -> [String] -> [ModuleToScan] -> m [ModuleToScan]
- getFileContents :: SessionMonad m => Path -> m (Maybe (POSIXTime, Text))
- module HsDev.Symbols.Types
- module Control.Monad.Except
Enumerate functions
type CompileFlag = String Source #
Compile flags
type ModuleToScan = (ModuleLocation, [CompileFlag], Maybe Text) Source #
Module with flags ready to scan
type ProjectToScan = (Project, [ModuleToScan]) Source #
Project ready to scan
type PackageDbToScan = PackageDbStack Source #
Package-db sandbox to scan (top of stack)
class EnumContents a where Source #
enumContents :: CommandMonad m => a -> m ScanContents Source #
enumRescan :: CommandMonad m => FilePath -> m ScanContents Source #
Enum rescannable (i.e. already scanned) file
enumDependent :: CommandMonad m => FilePath -> m ScanContents Source #
Enum file dependent
enumProject :: CommandMonad m => Project -> m ScanContents Source #
Enum project sources
enumSandbox :: CommandMonad m => Sandbox -> m ScanContents Source #
Enum sandbox
enumDirectory :: CommandMonad m => FilePath -> m ScanContents Source #
Enum directory modules
Scan
scanProjectFile :: CommandMonad m => [String] -> Path -> m Project Source #
Scan project file
scanModify :: CommandMonad m => ([String] -> Module -> m Module) -> InspectedModule -> m InspectedModule Source #
Scan additional info and modify scanned module
upToDate :: SessionMonad m => ModuleLocation -> [String] -> Inspection -> m Bool Source #
Is inspected module up to date?
changedModules :: SessionMonad m => Map ModuleLocation Inspection -> [String] -> [ModuleToScan] -> m [ModuleToScan] Source #
Returns new (to scan) and changed (to rescan) modules
getFileContents :: SessionMonad m => Path -> m (Maybe (POSIXTime, Text)) Source #
Returns file contents if it was set and still actual
Reexportss
module HsDev.Symbols.Types
module Control.Monad.Except