Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Interceptor that adds internal RPC handlers to the host.
Synopsis
- watcherEvents :: [(Text, AutocmdPatterns)]
- updateVar :: Member (VariableWatcher !! Report) r => Handler r ()
- watcherRpc :: forall r. Member (VariableWatcher !! Report) r => PluginName -> Text -> AutocmdPatterns -> RpcHandler r
- deleteScratch :: Member (Scratch !! RpcError) r => ScratchId -> Handler r ()
- deleteName :: PluginName -> RpcName
- builtinHandlers :: forall r. Members [Scratch !! RpcError, VariableWatcher !! Report] r => PluginName -> [RpcHandler r]
- type BuiltinHandlersDeps = [VariableWatcher !! Report, Handlers !! Report, Scratch !! RpcError, Rpc !! RpcError, Reader PluginName, Error BootError, Log]
- interceptHandlersBuiltin :: Members BuiltinHandlersDeps r => Sem r a -> Sem r a
Documentation
watcherEvents :: [(Text, AutocmdPatterns)] Source #
The set of autocmds that should trigger an update in VariableWatcher
.
updateVar :: Member (VariableWatcher !! Report) r => Handler r () Source #
Run update
and restop errors.
watcherRpc :: forall r. Member (VariableWatcher !! Report) r => PluginName -> Text -> AutocmdPatterns -> RpcHandler r Source #
Declare an autocmd that triggers the variable watcher.
deleteScratch :: Member (Scratch !! RpcError) r => ScratchId -> Handler r () Source #
Delete a scratch buffer.
deleteName :: PluginName -> RpcName Source #
The name for the handler that is triggered by a scratch buffer being deleted.
builtinHandlers :: forall r. Members [Scratch !! RpcError, VariableWatcher !! Report] r => PluginName -> [RpcHandler r] Source #
A set of RpcHandler
s for internal tasks.
type BuiltinHandlersDeps = [VariableWatcher !! Report, Handlers !! Report, Scratch !! RpcError, Rpc !! RpcError, Reader PluginName, Error BootError, Log] Source #
The dependencies of the builtin handlers.
interceptHandlersBuiltin :: Members BuiltinHandlersDeps r => Sem r a -> Sem r a Source #
Add builtin handlers to Handlers
without removing the effect from the stack.