Safe Haskell | None |
---|---|
Language | Haskell98 |
HsDev.Server.Types
- data CommandOptions = CommandOptions {
- commandDatabase :: Async Database
- commandWriteCache :: Database -> IO ()
- commandReadCache :: (FilePath -> ExceptT String IO Structured) -> IO (Maybe Database)
- commandRoot :: FilePath
- commandLog :: Level -> String -> IO ()
- commandLogger :: Log
- commandListenLog :: ([String] -> IO ()) -> IO ()
- commandLogWait :: IO ()
- commandWatcher :: Watcher
- commandGhc :: Worker Ghc
- commandGhci :: Worker Ghc
- commandGhcMod :: Worker (ReaderT WorkerMap IO)
- commandNotify :: Notification -> IO ()
- commandLink :: IO ()
- commandHold :: IO ()
- commandExit :: IO ()
- commandDefines :: [(String, String)]
- data CommandError = CommandError String [Pair]
- commandError_ :: String -> ExceptT CommandError IO a
- commandError :: String -> [Pair] -> ExceptT CommandError IO a
- type CommandM a = ExceptT CommandError IO a
- data ServerCommand
- data ServerOpts = ServerOpts {}
- data ClientOpts = ClientOpts {
- clientPort :: Int
- clientPretty :: Bool
- clientStdin :: Bool
- clientTimeout :: Int
- clientSilent :: Bool
- serverOptsArgs :: ServerOpts -> [String]
- data Request = Request {}
- data Command
- = Ping
- | Listen
- | AddData { }
- | Scan {
- scanProjects :: [FilePath]
- scanSandboxes :: [Cabal]
- scanFiles :: [FilePath]
- scanPaths :: [FilePath]
- scanContents :: [FileContents]
- scanGhcOpts :: [String]
- scanDocs :: Bool
- scanInferTypes :: Bool
- | RefineDocs {
- docsProjects :: [FilePath]
- docsFiles :: [FilePath]
- docsModules :: [String]
- | InferTypes {
- inferProjects :: [FilePath]
- inferFiles :: [FilePath]
- inferModules :: [String]
- | Remove {
- removeProjects :: [FilePath]
- removePackages :: [String]
- removeSandboxes :: [Cabal]
- removeFiles :: [FilePath]
- | InfoModules TargetFilter
- | InfoPackages
- | InfoProjects
- | InfoSandboxes
- | InfoSymbol SearchQuery TargetFilter
- | InfoModule SearchQuery TargetFilter
- | InfoResolve FilePath Bool
- | InfoProject (Either String FilePath)
- | InfoSandbox FilePath
- | Lookup String FilePath
- | Whois String FilePath
- | ResolveScopeModules FilePath
- | ResolveScope SearchQuery Bool FilePath
- | Complete String Bool FilePath
- | Hayoo {
- hayooQuery :: String
- hayooPage :: Int
- hayooPages :: Int
- | CabalList {
- cabalListPackages :: [String]
- | Lint {
- lintFiles :: [FilePath]
- lintContents :: [FileContents]
- | Check {
- checkFiles :: [FilePath]
- checkContents :: [FileContents]
- checkGhcOpts :: [String]
- | CheckLint { }
- | Types {
- typesFiles :: [FilePath]
- typesContents :: [FileContents]
- typesGhcOpts :: [String]
- | GhcMod { }
- | AutoFix { }
- | GhcEval {
- ghcEvalExpressions :: [String]
- | Link { }
- | Exit
- data AddedContents
- data GhcModCommand
- = GhcModLang
- | GhcModFlags
- | GhcModType Position FilePath [String]
- | GhcModLint [FilePath] [String]
- | GhcModCheck [FilePath] [String]
- | GhcModCheckLint [FilePath] [String] [String]
- data AutoFixCommand
- data FileContents = FileContents FilePath String
- data TargetFilter
- data SearchQuery = SearchQuery String SearchType
- data SearchType
- class FromCmd a where
Documentation
data CommandOptions Source
Constructors
CommandOptions | |
Fields
|
commandError_ :: String -> ExceptT CommandError IO a Source
commandError :: String -> [Pair] -> ExceptT CommandError IO a Source
type CommandM a = ExceptT CommandError IO a Source
data ServerCommand Source
Server control command
Constructors
Version | |
Start ServerOpts | |
Run ServerOpts | |
Stop ClientOpts | |
Connect ClientOpts | |
Remote ClientOpts Bool Command |
Instances
data ServerOpts Source
Server options
Constructors
ServerOpts | |
Fields
|
Instances
data ClientOpts Source
Client options
Constructors
ClientOpts | |
Fields
|
Instances
serverOptsArgs :: ServerOpts -> [String] Source
Constructors
Request | |
Fields
|
Command from client
Constructors
data AddedContents Source
Constructors
AddedDatabase Database | |
AddedModule InspectedModule | |
AddedProject Project |
data GhcModCommand Source
Constructors
GhcModLang | |
GhcModFlags | |
GhcModType Position FilePath [String] | |
GhcModLint [FilePath] [String] | |
GhcModCheck [FilePath] [String] | |
GhcModCheckLint [FilePath] [String] [String] |
data AutoFixCommand Source
Constructors
AutoFixShow [Note OutputMessage] | |
AutoFixFix [Note Correction] [Note Correction] Bool |
data FileContents Source
Constructors
FileContents FilePath String |
data TargetFilter Source
data SearchQuery Source
Constructors
SearchQuery String SearchType |
data SearchType Source
Constructors
SearchExact | |
SearchPrefix | |
SearchInfix | |
SearchSuffix | |
SearchRegex |
Instances