Safe Haskell | Safe-Inferred |
---|---|
Language | GHC2021 |
A Shake implementation of the compiler service, built using the Shaker abstraction layer for in-memory use.
Synopsis
- newtype GhcSessionDeps where
- GhcSessionDeps_ { }
- pattern GhcSessionDeps :: GhcSessionDeps
- data TcModuleResult = TcModuleResult {}
- data FileOfInterestStatus
- data GetParsedModule = GetParsedModule
- data GhcSessionIO = GhcSessionIO
- data GetClientSettings = GetClientSettings
- newtype GhcSessionDeps = GhcSessionDeps_ {}
- newtype GetModificationTime = GetModificationTime_ {}
- data FileVersion
- data GenerateCore = GenerateCore
- data GetHieAst = GetHieAst
- data TypeCheck = TypeCheck
- data IdeGhcSession = IdeGhcSession {
- loadSessionFun :: FilePath -> IO (IdeResult HscEnvEq, [FilePath])
- sessionVersion :: !Int
- data GhcSession = GhcSession
- data GetFileExists = GetFileExists
- newtype ImportMap = ImportMap {}
- data GetLocatedImports = GetLocatedImports
- data GetKnownTargets = GetKnownTargets
- data LinkableType
- data GetParsedModuleWithComments = GetParsedModuleWithComments
- data GetModuleGraph = GetModuleGraph
- data GetLinkable = GetLinkable
- data LinkableResult = LinkableResult {}
- data GetImportMap = GetImportMap
- data Splices = Splices {
- exprSplices :: [(LHsExpr GhcTc, LHsExpr GhcPs)]
- patSplices :: [(LHsExpr GhcTc, LPat GhcPs)]
- typeSplices :: [(LHsExpr GhcTc, LHsType GhcPs)]
- declSplices :: [(LHsExpr GhcTc, [LHsDecl GhcPs])]
- awSplices :: [(LHsExpr GhcTc, Serialized)]
- data HiFileResult = HiFileResult {
- hirModSummary :: !ModSummary
- hirModIface :: !ModIface
- hirModDetails :: ModDetails
- hirIfaceFp :: !ByteString
- hirRuntimeModules :: !(ModuleEnv ByteString)
- hirCoreFp :: !(Maybe (CoreFile, ByteString))
- data HieAstResult = forall a.Typeable a => HAR {}
- data HieKind a where
- data GetBindings = GetBindings
- data DocAndTyThingMap = DKMap {
- getDocMap :: !DocMap
- getTyThingMap :: !TyThingMap
- data GetDocMap = GetDocMap
- data ReportImportCycles = ReportImportCycles
- data GetModIfaceFromDisk = GetModIfaceFromDisk
- data GetModIfaceFromDiskAndIndex = GetModIfaceFromDiskAndIndex
- data GetModIface = GetModIface
- data GetFileContents = GetFileContents
- data AddWatchedFile = AddWatchedFile
- data IsFileOfInterestResult
- data IsFileOfInterest = IsFileOfInterest
- data ModSummaryResult = ModSummaryResult {}
- data GetModSummary = GetModSummary
- data GetModSummaryWithoutTimestamps = GetModSummaryWithoutTimestamps
- data NeedsCompilation = NeedsCompilation
- pattern GhcSessionDeps :: GhcSessionDeps
- pattern GetModificationTime :: GetModificationTime
- encodeLinkableType :: Maybe LinkableType -> ByteString
- tmrModSummary :: TcModuleResult -> ModSummary
- hiFileFingerPrint :: HiFileResult -> ByteString
- mkHiFileResult :: ModSummary -> ModIface -> ModDetails -> ModuleEnv ByteString -> Maybe (CoreFile, ByteString) -> HiFileResult
- vfsVersion :: FileVersion -> Maybe Int32
- awSplicesL :: Lens' Splices [(LHsExpr GhcTc, Serialized)]
- declSplicesL :: Lens' Splices [(LHsExpr GhcTc, [LHsDecl GhcPs])]
- exprSplicesL :: Lens' Splices [(LHsExpr GhcTc, LHsExpr GhcPs)]
- patSplicesL :: Lens' Splices [(LHsExpr GhcTc, LPat GhcPs)]
- typeSplicesL :: Lens' Splices [(LHsExpr GhcTc, LHsType GhcPs)]
Documentation
newtype GhcSessionDeps Source #
GhcSessionDeps_ | |
|
pattern GhcSessionDeps :: GhcSessionDeps |
Instances
Show GhcSessionDeps Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> GhcSessionDeps -> ShowS # show :: GhcSessionDeps -> String # showList :: [GhcSessionDeps] -> ShowS # | |
NFData GhcSessionDeps Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: GhcSessionDeps -> () # | |
Eq GhcSessionDeps Source # | |
Defined in Development.IDE.Core.RuleTypes (==) :: GhcSessionDeps -> GhcSessionDeps -> Bool # (/=) :: GhcSessionDeps -> GhcSessionDeps -> Bool # | |
Hashable GhcSessionDeps Source # | |
Defined in Development.IDE.Core.RuleTypes hashWithSalt :: Int -> GhcSessionDeps -> Int # hash :: GhcSessionDeps -> Int # | |
type RuleResult GhcSessionDeps Source # | A GHC session preloaded with all the dependencies This rule is also responsible for calling ReportImportCycles for the direct dependencies |
Defined in Development.IDE.Core.RuleTypes |
data TcModuleResult Source #
Contains the typechecked module and the OrigNameCache entry for that module.
TcModuleResult | |
|
Instances
Show TcModuleResult Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> TcModuleResult -> ShowS # show :: TcModuleResult -> String # showList :: [TcModuleResult] -> ShowS # | |
NFData TcModuleResult Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: TcModuleResult -> () # |
data FileOfInterestStatus Source #
Instances
data GetParsedModule Source #
Instances
data GhcSessionIO Source #
Instances
Generic GhcSessionIO Source # | |
Defined in Development.IDE.Core.RuleTypes type Rep GhcSessionIO :: Type -> Type # from :: GhcSessionIO -> Rep GhcSessionIO x # to :: Rep GhcSessionIO x -> GhcSessionIO # | |
Show GhcSessionIO Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> GhcSessionIO -> ShowS # show :: GhcSessionIO -> String # showList :: [GhcSessionIO] -> ShowS # | |
NFData GhcSessionIO Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: GhcSessionIO -> () # | |
Eq GhcSessionIO Source # | |
Defined in Development.IDE.Core.RuleTypes (==) :: GhcSessionIO -> GhcSessionIO -> Bool # (/=) :: GhcSessionIO -> GhcSessionIO -> Bool # | |
Hashable GhcSessionIO Source # | |
Defined in Development.IDE.Core.RuleTypes hashWithSalt :: Int -> GhcSessionIO -> Int # hash :: GhcSessionIO -> Int # | |
type Rep GhcSessionIO Source # | |
type RuleResult GhcSessionIO Source # | |
Defined in Development.IDE.Core.RuleTypes |
data GetClientSettings Source #
Get the client config stored in the ide state
Instances
newtype GhcSessionDeps Source #
GhcSessionDeps_ | |
|
Instances
Show GhcSessionDeps Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> GhcSessionDeps -> ShowS # show :: GhcSessionDeps -> String # showList :: [GhcSessionDeps] -> ShowS # | |
NFData GhcSessionDeps Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: GhcSessionDeps -> () # | |
Eq GhcSessionDeps Source # | |
Defined in Development.IDE.Core.RuleTypes (==) :: GhcSessionDeps -> GhcSessionDeps -> Bool # (/=) :: GhcSessionDeps -> GhcSessionDeps -> Bool # | |
Hashable GhcSessionDeps Source # | |
Defined in Development.IDE.Core.RuleTypes hashWithSalt :: Int -> GhcSessionDeps -> Int # hash :: GhcSessionDeps -> Int # | |
type RuleResult GhcSessionDeps Source # | A GHC session preloaded with all the dependencies This rule is also responsible for calling ReportImportCycles for the direct dependencies |
Defined in Development.IDE.Core.RuleTypes |
newtype GetModificationTime Source #
GetModificationTime_ | |
|
Instances
data FileVersion Source #
Either the mtime from disk or an LSP version LSP versions always compare as greater than on disk versions
Instances
data GenerateCore Source #
Instances
Generic GenerateCore Source # | |
Defined in Development.IDE.Core.RuleTypes type Rep GenerateCore :: Type -> Type # from :: GenerateCore -> Rep GenerateCore x # to :: Rep GenerateCore x -> GenerateCore # | |
Show GenerateCore Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> GenerateCore -> ShowS # show :: GenerateCore -> String # showList :: [GenerateCore] -> ShowS # | |
NFData GenerateCore Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: GenerateCore -> () # | |
Eq GenerateCore Source # | |
Defined in Development.IDE.Core.RuleTypes (==) :: GenerateCore -> GenerateCore -> Bool # (/=) :: GenerateCore -> GenerateCore -> Bool # | |
Hashable GenerateCore Source # | |
Defined in Development.IDE.Core.RuleTypes hashWithSalt :: Int -> GenerateCore -> Int # hash :: GenerateCore -> Int # | |
type Rep GenerateCore Source # | |
type RuleResult GenerateCore Source # | Convert to Core, requires TypeCheck* |
Defined in Development.IDE.Core.RuleTypes |
Instances
Generic GetHieAst Source # | |
Show GetHieAst Source # | |
NFData GetHieAst Source # | |
Defined in Development.IDE.Core.RuleTypes | |
Eq GetHieAst Source # | |
Hashable GetHieAst Source # | |
Defined in Development.IDE.Core.RuleTypes | |
type Rep GetHieAst Source # | |
type RuleResult GetHieAst Source # | The uncompressed HieAST |
Defined in Development.IDE.Core.RuleTypes |
Instances
Generic TypeCheck Source # | |
Show TypeCheck Source # | |
NFData TypeCheck Source # | |
Defined in Development.IDE.Core.RuleTypes | |
Eq TypeCheck Source # | |
Hashable TypeCheck Source # | |
Defined in Development.IDE.Core.RuleTypes | |
type Rep TypeCheck Source # | |
type RuleResult TypeCheck Source # | The type checked version of this file, requires TypeCheck+ |
Defined in Development.IDE.Core.RuleTypes |
data IdeGhcSession Source #
IdeGhcSession | |
|
Instances
Show IdeGhcSession Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> IdeGhcSession -> ShowS # show :: IdeGhcSession -> String # showList :: [IdeGhcSession] -> ShowS # | |
NFData IdeGhcSession Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: IdeGhcSession -> () # |
data GhcSession Source #
Instances
Generic GhcSession Source # | |
Defined in Development.IDE.Core.RuleTypes type Rep GhcSession :: Type -> Type # from :: GhcSession -> Rep GhcSession x # to :: Rep GhcSession x -> GhcSession # | |
Show GhcSession Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> GhcSession -> ShowS # show :: GhcSession -> String # showList :: [GhcSession] -> ShowS # | |
NFData GhcSession Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: GhcSession -> () # | |
Eq GhcSession Source # | |
Defined in Development.IDE.Core.RuleTypes (==) :: GhcSession -> GhcSession -> Bool # (/=) :: GhcSession -> GhcSession -> Bool # | |
Hashable GhcSession Source # | |
Defined in Development.IDE.Core.RuleTypes hashWithSalt :: Int -> GhcSession -> Int # hash :: GhcSession -> Int # | |
type Rep GhcSession Source # | |
type RuleResult GhcSession Source # | A GHC session that we reuse. |
Defined in Development.IDE.Core.RuleTypes |
data GetFileExists Source #
Instances
Generic GetFileExists Source # | |
Defined in Development.IDE.Core.RuleTypes type Rep GetFileExists :: Type -> Type # from :: GetFileExists -> Rep GetFileExists x # to :: Rep GetFileExists x -> GetFileExists # | |
Show GetFileExists Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> GetFileExists -> ShowS # show :: GetFileExists -> String # showList :: [GetFileExists] -> ShowS # | |
NFData GetFileExists Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: GetFileExists -> () # | |
Eq GetFileExists Source # | |
Defined in Development.IDE.Core.RuleTypes (==) :: GetFileExists -> GetFileExists -> Bool # (/=) :: GetFileExists -> GetFileExists -> Bool # | |
Hashable GetFileExists Source # | |
Defined in Development.IDE.Core.RuleTypes hashWithSalt :: Int -> GetFileExists -> Int # hash :: GetFileExists -> Int # | |
type Rep GetFileExists Source # | |
type RuleResult GetFileExists Source # | |
Defined in Development.IDE.Core.RuleTypes |
ImportMap | |
|
data GetLocatedImports Source #
Instances
data GetKnownTargets Source #
Instances
data LinkableType Source #
Instances
data GetParsedModuleWithComments Source #
Instances
Generic GetParsedModuleWithComments Source # | |
Defined in Development.IDE.Core.RuleTypes type Rep GetParsedModuleWithComments :: Type -> Type # | |
Show GetParsedModuleWithComments Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> GetParsedModuleWithComments -> ShowS # show :: GetParsedModuleWithComments -> String # showList :: [GetParsedModuleWithComments] -> ShowS # | |
NFData GetParsedModuleWithComments Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: GetParsedModuleWithComments -> () # | |
Eq GetParsedModuleWithComments Source # | |
Hashable GetParsedModuleWithComments Source # | |
Defined in Development.IDE.Core.RuleTypes hashWithSalt :: Int -> GetParsedModuleWithComments -> Int # hash :: GetParsedModuleWithComments -> Int # | |
type Rep GetParsedModuleWithComments Source # | |
type RuleResult GetParsedModuleWithComments Source # | The parse tree for the file using GetFileContents, all comments included using Opt_KeepRawTokenStream |
Defined in Development.IDE.Core.RuleTypes |
data GetModuleGraph Source #
Instances
Generic GetModuleGraph Source # | |
Defined in Development.IDE.Core.RuleTypes type Rep GetModuleGraph :: Type -> Type # from :: GetModuleGraph -> Rep GetModuleGraph x # to :: Rep GetModuleGraph x -> GetModuleGraph # | |
Show GetModuleGraph Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> GetModuleGraph -> ShowS # show :: GetModuleGraph -> String # showList :: [GetModuleGraph] -> ShowS # | |
NFData GetModuleGraph Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: GetModuleGraph -> () # | |
Eq GetModuleGraph Source # | |
Defined in Development.IDE.Core.RuleTypes (==) :: GetModuleGraph -> GetModuleGraph -> Bool # (/=) :: GetModuleGraph -> GetModuleGraph -> Bool # | |
Hashable GetModuleGraph Source # | |
Defined in Development.IDE.Core.RuleTypes hashWithSalt :: Int -> GetModuleGraph -> Int # hash :: GetModuleGraph -> Int # | |
type Rep GetModuleGraph Source # | |
type RuleResult GetModuleGraph Source # | |
Defined in Development.IDE.Core.RuleTypes |
data GetLinkable Source #
Instances
Generic GetLinkable Source # | |
Defined in Development.IDE.Core.RuleTypes type Rep GetLinkable :: Type -> Type # from :: GetLinkable -> Rep GetLinkable x # to :: Rep GetLinkable x -> GetLinkable # | |
Show GetLinkable Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> GetLinkable -> ShowS # show :: GetLinkable -> String # showList :: [GetLinkable] -> ShowS # | |
NFData GetLinkable Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: GetLinkable -> () # | |
Eq GetLinkable Source # | |
Defined in Development.IDE.Core.RuleTypes (==) :: GetLinkable -> GetLinkable -> Bool # (/=) :: GetLinkable -> GetLinkable -> Bool # | |
Hashable GetLinkable Source # | |
Defined in Development.IDE.Core.RuleTypes hashWithSalt :: Int -> GetLinkable -> Int # hash :: GetLinkable -> Int # | |
type Rep GetLinkable Source # | |
type RuleResult GetLinkable Source # | |
Defined in Development.IDE.Core.RuleTypes |
data LinkableResult Source #
LinkableResult | |
|
Instances
Show LinkableResult Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> LinkableResult -> ShowS # show :: LinkableResult -> String # showList :: [LinkableResult] -> ShowS # | |
NFData LinkableResult Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: LinkableResult -> () # |
data GetImportMap Source #
Instances
Generic GetImportMap Source # | |
Defined in Development.IDE.Core.RuleTypes type Rep GetImportMap :: Type -> Type # from :: GetImportMap -> Rep GetImportMap x # to :: Rep GetImportMap x -> GetImportMap # | |
Show GetImportMap Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> GetImportMap -> ShowS # show :: GetImportMap -> String # showList :: [GetImportMap] -> ShowS # | |
NFData GetImportMap Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: GetImportMap -> () # | |
Eq GetImportMap Source # | |
Defined in Development.IDE.Core.RuleTypes (==) :: GetImportMap -> GetImportMap -> Bool # (/=) :: GetImportMap -> GetImportMap -> Bool # | |
Hashable GetImportMap Source # | |
Defined in Development.IDE.Core.RuleTypes hashWithSalt :: Int -> GetImportMap -> Int # hash :: GetImportMap -> Int # | |
type Rep GetImportMap Source # | |
type RuleResult GetImportMap Source # | |
Defined in Development.IDE.Core.RuleTypes |
Splices | |
|
data HiFileResult Source #
HiFileResult | |
|
Instances
Show HiFileResult Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> HiFileResult -> ShowS # show :: HiFileResult -> String # showList :: [HiFileResult] -> ShowS # | |
NFData HiFileResult Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: HiFileResult -> () # |
data HieAstResult Source #
Save the uncompressed AST here, we compress it just before writing to disk
Instances
Show HieAstResult Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> HieAstResult -> ShowS # show :: HieAstResult -> String # showList :: [HieAstResult] -> ShowS # | |
NFData HieAstResult Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: HieAstResult -> () # |
data GetBindings Source #
Instances
Generic GetBindings Source # | |
Defined in Development.IDE.Core.RuleTypes type Rep GetBindings :: Type -> Type # from :: GetBindings -> Rep GetBindings x # to :: Rep GetBindings x -> GetBindings # | |
Show GetBindings Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> GetBindings -> ShowS # show :: GetBindings -> String # showList :: [GetBindings] -> ShowS # | |
NFData GetBindings Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: GetBindings -> () # | |
Eq GetBindings Source # | |
Defined in Development.IDE.Core.RuleTypes (==) :: GetBindings -> GetBindings -> Bool # (/=) :: GetBindings -> GetBindings -> Bool # | |
Hashable GetBindings Source # | |
Defined in Development.IDE.Core.RuleTypes hashWithSalt :: Int -> GetBindings -> Int # hash :: GetBindings -> Int # | |
type Rep GetBindings Source # | |
type RuleResult GetBindings Source # | A IntervalMap telling us what is in scope at each point |
Defined in Development.IDE.Core.RuleTypes |
data DocAndTyThingMap Source #
DKMap | |
|
Instances
Show DocAndTyThingMap Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> DocAndTyThingMap -> ShowS # show :: DocAndTyThingMap -> String # showList :: [DocAndTyThingMap] -> ShowS # | |
NFData DocAndTyThingMap Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: DocAndTyThingMap -> () # |
Instances
Generic GetDocMap Source # | |
Show GetDocMap Source # | |
NFData GetDocMap Source # | |
Defined in Development.IDE.Core.RuleTypes | |
Eq GetDocMap Source # | |
Hashable GetDocMap Source # | |
Defined in Development.IDE.Core.RuleTypes | |
type Rep GetDocMap Source # | |
type RuleResult GetDocMap Source # | |
Defined in Development.IDE.Core.RuleTypes |
data ReportImportCycles Source #
Instances
data GetModIfaceFromDisk Source #
Instances
data GetModIfaceFromDiskAndIndex Source #
Instances
Generic GetModIfaceFromDiskAndIndex Source # | |
Defined in Development.IDE.Core.RuleTypes type Rep GetModIfaceFromDiskAndIndex :: Type -> Type # | |
Show GetModIfaceFromDiskAndIndex Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> GetModIfaceFromDiskAndIndex -> ShowS # show :: GetModIfaceFromDiskAndIndex -> String # showList :: [GetModIfaceFromDiskAndIndex] -> ShowS # | |
NFData GetModIfaceFromDiskAndIndex Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: GetModIfaceFromDiskAndIndex -> () # | |
Eq GetModIfaceFromDiskAndIndex Source # | |
Hashable GetModIfaceFromDiskAndIndex Source # | |
Defined in Development.IDE.Core.RuleTypes hashWithSalt :: Int -> GetModIfaceFromDiskAndIndex -> Int # hash :: GetModIfaceFromDiskAndIndex -> Int # | |
type Rep GetModIfaceFromDiskAndIndex Source # | |
type RuleResult GetModIfaceFromDiskAndIndex Source # | GetModIfaceFromDisk and index the `.hie` file into the database.
This is an internal rule, use |
Defined in Development.IDE.Core.RuleTypes |
data GetModIface Source #
Instances
Generic GetModIface Source # | |
Defined in Development.IDE.Core.RuleTypes type Rep GetModIface :: Type -> Type # from :: GetModIface -> Rep GetModIface x # to :: Rep GetModIface x -> GetModIface # | |
Show GetModIface Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> GetModIface -> ShowS # show :: GetModIface -> String # showList :: [GetModIface] -> ShowS # | |
NFData GetModIface Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: GetModIface -> () # | |
Eq GetModIface Source # | |
Defined in Development.IDE.Core.RuleTypes (==) :: GetModIface -> GetModIface -> Bool # (/=) :: GetModIface -> GetModIface -> Bool # | |
Hashable GetModIface Source # | |
Defined in Development.IDE.Core.RuleTypes hashWithSalt :: Int -> GetModIface -> Int # hash :: GetModIface -> Int # | |
type Rep GetModIface Source # | |
type RuleResult GetModIface Source # | Get a module interface details, either from an interface file or a typechecked module |
Defined in Development.IDE.Core.RuleTypes |
data GetFileContents Source #
Instances
data AddWatchedFile Source #
Instances
Generic AddWatchedFile Source # | |
Defined in Development.IDE.Core.RuleTypes type Rep AddWatchedFile :: Type -> Type # from :: AddWatchedFile -> Rep AddWatchedFile x # to :: Rep AddWatchedFile x -> AddWatchedFile # | |
Show AddWatchedFile Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> AddWatchedFile -> ShowS # show :: AddWatchedFile -> String # showList :: [AddWatchedFile] -> ShowS # | |
NFData AddWatchedFile Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: AddWatchedFile -> () # | |
Eq AddWatchedFile Source # | |
Defined in Development.IDE.Core.RuleTypes (==) :: AddWatchedFile -> AddWatchedFile -> Bool # (/=) :: AddWatchedFile -> AddWatchedFile -> Bool # | |
Hashable AddWatchedFile Source # | |
Defined in Development.IDE.Core.RuleTypes hashWithSalt :: Int -> AddWatchedFile -> Int # hash :: AddWatchedFile -> Int # | |
type Rep AddWatchedFile Source # | |
type RuleResult AddWatchedFile Source # | |
Defined in Development.IDE.Core.RuleTypes |
data IsFileOfInterestResult Source #
Instances
data IsFileOfInterest Source #
Instances
Generic IsFileOfInterest Source # | |
Defined in Development.IDE.Core.RuleTypes type Rep IsFileOfInterest :: Type -> Type # from :: IsFileOfInterest -> Rep IsFileOfInterest x # to :: Rep IsFileOfInterest x -> IsFileOfInterest # | |
Show IsFileOfInterest Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> IsFileOfInterest -> ShowS # show :: IsFileOfInterest -> String # showList :: [IsFileOfInterest] -> ShowS # | |
NFData IsFileOfInterest Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: IsFileOfInterest -> () # | |
Eq IsFileOfInterest Source # | |
Defined in Development.IDE.Core.RuleTypes (==) :: IsFileOfInterest -> IsFileOfInterest -> Bool # (/=) :: IsFileOfInterest -> IsFileOfInterest -> Bool # | |
Hashable IsFileOfInterest Source # | |
Defined in Development.IDE.Core.RuleTypes hashWithSalt :: Int -> IsFileOfInterest -> Int # hash :: IsFileOfInterest -> Int # | |
type Rep IsFileOfInterest Source # | |
type RuleResult IsFileOfInterest Source # | |
Defined in Development.IDE.Core.RuleTypes |
data ModSummaryResult Source #
ModSummaryResult | |
|
Instances
Show ModSummaryResult Source # | |
Defined in Development.IDE.Core.RuleTypes showsPrec :: Int -> ModSummaryResult -> ShowS # show :: ModSummaryResult -> String # showList :: [ModSummaryResult] -> ShowS # | |
NFData ModSummaryResult Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: ModSummaryResult -> () # |
data GetModSummary Source #
Instances
data GetModSummaryWithoutTimestamps Source #
Instances
Generic GetModSummaryWithoutTimestamps Source # | |
Defined in Development.IDE.Core.RuleTypes type Rep GetModSummaryWithoutTimestamps :: Type -> Type # | |
Show GetModSummaryWithoutTimestamps Source # | |
Defined in Development.IDE.Core.RuleTypes | |
NFData GetModSummaryWithoutTimestamps Source # | |
Defined in Development.IDE.Core.RuleTypes rnf :: GetModSummaryWithoutTimestamps -> () # | |
Eq GetModSummaryWithoutTimestamps Source # | |
Hashable GetModSummaryWithoutTimestamps Source # | |
Defined in Development.IDE.Core.RuleTypes hashWithSalt :: Int -> GetModSummaryWithoutTimestamps -> Int # | |
type Rep GetModSummaryWithoutTimestamps Source # | |
type RuleResult GetModSummaryWithoutTimestamps Source # | Generate a ModSummary with the timestamps and preprocessed content elided, for more successful early cutoff |
data NeedsCompilation Source #
Instances
pattern GhcSessionDeps :: GhcSessionDeps Source #
pattern GetModificationTime :: GetModificationTime Source #
encodeLinkableType :: Maybe LinkableType -> ByteString Source #
Encode the linkable into an ordered bytestring.
This is used to drive an ordered "newness" predicate in the
NeedsCompilation
build rule.
mkHiFileResult :: ModSummary -> ModIface -> ModDetails -> ModuleEnv ByteString -> Maybe (CoreFile, ByteString) -> HiFileResult Source #
vfsVersion :: FileVersion -> Maybe Int32 Source #
awSplicesL :: Lens' Splices [(LHsExpr GhcTc, Serialized)] Source #