Safe Haskell | None |
---|---|
Language | Haskell2010 |
- runGmPkgGhc :: (IOish m, Gm m) => LightGhc a -> m a
- initSession :: IOish m => [GHCOption] -> (DynFlags -> Ghc DynFlags) -> GhcModT m ()
- dropSession :: IOish m => GhcModT m ()
- runGmlT :: IOish m => [Either FilePath ModuleName] -> GmlT m a -> GhcModT m a
- runGmlT' :: IOish m => [Either FilePath ModuleName] -> (DynFlags -> Ghc DynFlags) -> GmlT m a -> GhcModT m a
- runGmlTWith :: IOish m => [Either FilePath ModuleName] -> (DynFlags -> Ghc DynFlags) -> (GmlT m a -> GmlT m b) -> GmlT m a -> GhcModT m b
- targetGhcOptions :: forall m. IOish m => Cradle -> Set (Either FilePath ModuleName) -> GhcModT m [GHCOption]
- resolvedComponentsCache :: IOish m => FilePath -> Cached (GhcModT m) GhcModState [GmComponent GMCRaw (Set ModulePath)] (Map ChComponentName (GmComponent GMCResolved (Set ModulePath)))
- moduleComponents :: Map ChComponentName (GmComponent t (Set ModulePath)) -> Either FilePath ModuleName -> Set ChComponentName
- findCandidates :: [Set ChComponentName] -> Set ChComponentName
- pickComponent :: Set ChComponentName -> ChComponentName
- packageGhcOptions :: (Applicative m, IOish m, Gm m) => m [GHCOption]
- sandboxOpts :: (IOish m, GmEnv m) => Cradle -> m [String]
- resolveGmComponent :: (IOish m, Gm m) => Maybe [CompilationUnit] -> GmComponent GMCRaw (Set ModulePath) -> m (GmComponent GMCResolved (Set ModulePath))
- resolveEntrypoint :: (IOish m, Gm m) => Cradle -> GmComponent GMCRaw ChEntrypoint -> m (GmComponent GMCRaw (Set ModulePath))
- resolveChEntrypoints :: FilePath -> ChEntrypoint -> IO [CompilationUnit]
- chModToMod :: ChModuleName -> ModuleName
- resolveModule :: (IOish m, Gm m) => HscEnv -> [FilePath] -> CompilationUnit -> m (Maybe ModulePath)
- type CompilationUnit = Either FilePath ModuleName
- resolveGmComponents :: (IOish m, Gm m) => Maybe [CompilationUnit] -> [GmComponent GMCRaw (Set ModulePath)] -> m (Map ChComponentName (GmComponent GMCResolved (Set ModulePath)))
- loadTargets :: IOish m => [GHCOption] -> [FilePath] -> GmlT m ()
- needsFallback :: ModuleGraph -> Bool
- cabalResolvedComponents :: IOish m => GhcModT m (Map ChComponentName (GmComponent GMCResolved (Set ModulePath)))
Documentation
runGmPkgGhc :: (IOish m, Gm m) => LightGhc a -> m a Source
dropSession :: IOish m => GhcModT m () Source
Drop the currently active GHC session, the next that requires a GHC session will initialize a new one.
runGmlT' :: IOish m => [Either FilePath ModuleName] -> (DynFlags -> Ghc DynFlags) -> GmlT m a -> GhcModT m a Source
runGmlTWith :: IOish m => [Either FilePath ModuleName] -> (DynFlags -> Ghc DynFlags) -> (GmlT m a -> GmlT m b) -> GmlT m a -> GhcModT m b Source
targetGhcOptions :: forall m. IOish m => Cradle -> Set (Either FilePath ModuleName) -> GhcModT m [GHCOption] Source
resolvedComponentsCache :: IOish m => FilePath -> Cached (GhcModT m) GhcModState [GmComponent GMCRaw (Set ModulePath)] (Map ChComponentName (GmComponent GMCResolved (Set ModulePath))) Source
moduleComponents :: Map ChComponentName (GmComponent t (Set ModulePath)) -> Either FilePath ModuleName -> Set ChComponentName Source
packageGhcOptions :: (Applicative m, IOish m, Gm m) => m [GHCOption] Source
:: (IOish m, Gm m) | |
=> Maybe [CompilationUnit] | Updated modules |
-> GmComponent GMCRaw (Set ModulePath) | |
-> m (GmComponent GMCResolved (Set ModulePath)) |
resolveEntrypoint :: (IOish m, Gm m) => Cradle -> GmComponent GMCRaw ChEntrypoint -> m (GmComponent GMCRaw (Set ModulePath)) Source
resolveChEntrypoints :: FilePath -> ChEntrypoint -> IO [CompilationUnit] Source
resolveModule :: (IOish m, Gm m) => HscEnv -> [FilePath] -> CompilationUnit -> m (Maybe ModulePath) Source
:: (IOish m, Gm m) | |
=> Maybe [CompilationUnit] | Updated modules |
-> [GmComponent GMCRaw (Set ModulePath)] | |
-> m (Map ChComponentName (GmComponent GMCResolved (Set ModulePath))) |
loadTargets :: IOish m => [GHCOption] -> [FilePath] -> GmlT m () Source
Set the files as targets and load them.
needsFallback :: ModuleGraph -> Bool Source
cabalResolvedComponents :: IOish m => GhcModT m (Map ChComponentName (GmComponent GMCResolved (Set ModulePath))) Source