Safe Haskell | None |
---|---|
Language | Haskell98 |
- list :: [String] -> Cabal -> ExceptT String IO [ModuleLocation]
- browse :: [String] -> Cabal -> String -> Maybe ModulePackage -> ExceptT String IO InspectedModule
- browseInspection :: [String] -> Inspection
- langs :: ExceptT String IO [String]
- flags :: ExceptT String IO [String]
- info :: [String] -> Cabal -> FilePath -> String -> GhcModT IO Declaration
- data TypedRegion = TypedRegion {}
- typeOf :: [String] -> Cabal -> FilePath -> Int -> Int -> GhcModT IO [TypedRegion]
- data OutputMessage = OutputMessage {}
- parseOutputMessages :: String -> [Note OutputMessage]
- parseOutputMessage :: String -> Maybe (Note OutputMessage)
- check :: [String] -> Cabal -> [FilePath] -> Maybe Project -> GhcModT IO [Note OutputMessage]
- lint :: [String] -> FilePath -> GhcModT IO [Note OutputMessage]
- runGhcMod :: (IOish m, MonadCatch m) => Options -> GhcModT m a -> ExceptT String m a
- locateGhcModEnv :: FilePath -> IO (Either Project Cabal)
- ghcModEnvPath :: FilePath -> Either Project Cabal -> FilePath
- ghcModWorker :: Either Project Cabal -> IO (Worker (GhcModT IO))
- type WorkerMap = MVar (Map FilePath (Worker (GhcModT IO)))
- ghcModMultiWorker :: IO (Worker (ReaderT WorkerMap IO))
- dispatch :: FilePath -> GhcModT IO a -> ReaderT WorkerMap IO (Async a)
- waitMultiGhcMod :: Worker (ReaderT WorkerMap IO) -> FilePath -> GhcModT IO a -> ExceptT String IO a
- type GhcModT m = GmT (GmOutT m)
- module Control.Concurrent.Worker
- module Control.Monad.Except
- module HsDev.Tools.Types
Documentation
browse :: [String] -> Cabal -> String -> Maybe ModulePackage -> ExceptT String IO InspectedModule Source
browseInspection :: [String] -> Inspection Source
data OutputMessage Source
Output message from some tool (ghc, ghc-mod, hlint) with optional suggestion
parseOutputMessages :: String -> [Note OutputMessage] Source
parseOutputMessage :: String -> Maybe (Note OutputMessage) Source
ghcModWorker :: Either Project Cabal -> IO (Worker (GhcModT IO)) Source
Create ghc-mod worker for project or for sandbox
ghcModMultiWorker :: IO (Worker (ReaderT WorkerMap IO)) Source
Manage many ghc-mod workers for each project/sandbox
waitMultiGhcMod :: Worker (ReaderT WorkerMap IO) -> FilePath -> GhcModT IO a -> ExceptT String IO a Source
module Control.Concurrent.Worker
module Control.Monad.Except
module HsDev.Tools.Types