module Ribosome.Nvim.Api.IO where

import Data.MessagePack (Object)

import Ribosome.Nvim.Api.Data (Buffer, Tabpage, Window)
import qualified Ribosome.Nvim.Api.Data as RpcData
import Ribosome.Nvim.Api.GenerateIO (generateIO)

m [Object]
m (Map Text Object)
m Tabpage
m [Tabpage]
m Window
m [Window]
m Buffer
m [Buffer]
m ()
m Text
m [Text]
m ()
m [Object]
m [Object]
m [Object]
m (Map Text Object)
m (Map Text Object)
m (Map Text Object)
m Tabpage
m [Tabpage]
m Window
m [Window]
m Buffer
m [Buffer]
m ()
m Text
m [Text]
m ()
Bool -> Bool -> m Buffer
Int -> m a
Int -> m [Object]
Int -> m (Map Text Object)
Int -> m ()
Int -> Bool -> m (Map Text Object)
Int -> Bool -> Bool -> Map Text Object -> m ()
Int -> Int -> m a
Int -> Int -> m ()
Int -> Int -> Bool -> m ()
Int -> Int -> Int -> m ()
Int -> Int -> Map Text Object -> m ()
[Text] -> Text -> Bool -> Bool -> m ()
[Object] -> m [Object]
Text -> m Int
Text -> m ()
Text -> m ()
Text -> m ()
Text -> m ()
Text -> m ()
Text -> m a
Text -> m a
Text -> m a
Text -> m ()
Text -> m ()
Text -> m Int
Text -> m a
Text -> m Text
Text -> m Int
Text -> m ()
Text -> m [Map Text Object]
Text -> m Int
Text -> m ()
Text -> m ()
Text -> m Int
Text -> m ()
Text -> m ()
Text -> m ()
Text -> m a
Text -> m a
Text -> m a
Text -> m ()
Text -> m a
Text -> m ()
Text -> m ()
Text -> m Int
Text -> m a
Text -> m Text
Text -> m Int
Text -> m ()
Text -> Bool -> m (Map Text Object)
Text -> Bool -> Bool -> Bool -> m Text
Text -> Bool -> Bool -> Bool -> m Text
Text -> Bool -> Int -> m Bool
Text -> [Object] -> m a
Text -> [Object] -> m a
Text -> [Object] -> m a
Text -> Text -> m ()
Text -> Text -> Bool -> m ()
Text -> Text -> Bool -> m (Map Text Object)
Text -> Text -> Bool -> m ()
Text -> Text -> Text -> Int -> Int -> Int -> m ()
Text -> Text -> Text -> Map Text Object -> m ()
Text
-> Map Text Object
-> Text
-> Map Text Object
-> Map Text Object
-> m ()
Text -> Object -> m ()
Text -> Object -> m ()
Text -> Object -> m ()
Text -> Object -> m a
Text -> Object -> m ()
Text -> Object -> m ()
Map Text Object -> m (Map Text Object)
Map Text Object -> m a
Map Text Object -> m (Map Text Object)
Object -> Text -> [Object] -> m a
Window -> m Bool
Window -> m Tabpage
Window -> m (Int, Int)
Window -> m Int
Window -> m Int
Window -> m (Int, Int)
Window -> m Buffer
Window -> m ()
Window -> m (Map Text Object)
Window -> m Bool
Window -> m Int
Window -> m Tabpage
Window -> m (Int, Int)
Window -> m Int
Window -> m Int
Window -> m (Int, Int)
Window -> m Buffer
Window -> m ()
Window -> Bool -> m ()
Window -> Int -> m ()
Window -> Int -> m ()
Window -> Int -> m ()
Window -> Int -> m ()
Window -> (Int, Int) -> m ()
Window -> (Int, Int) -> m ()
Window -> Text -> m a
Window -> Text -> m a
Window -> Text -> m a
Window -> Text -> m a
Window -> Text -> m ()
Window -> Text -> m a
Window -> Text -> Object -> m ()
Window -> Text -> Object -> m ()
Window -> Text -> Object -> m a
Window -> Text -> Object -> m ()
Window -> Map Text Object -> m ()
Window -> Buffer -> m ()
Tabpage -> m ()
Tabpage -> m Bool
Tabpage -> m Window
Tabpage -> m [Window]
Tabpage -> m ()
Tabpage -> m Bool
Tabpage -> m Int
Tabpage -> m Window
Tabpage -> m [Window]
Tabpage -> Text -> m a
Tabpage -> Text -> m a
Tabpage -> Text -> m ()
Tabpage -> Text -> m a
Tabpage -> Text -> Object -> m a
Tabpage -> Text -> Object -> m ()
Buffer -> m ()
Buffer -> m Bool
Buffer -> m Text
Buffer -> m Int
Buffer -> m Int
Buffer -> m ()
Buffer -> m Bool
Buffer -> m Bool
Buffer -> m Text
Buffer -> m Int
Buffer -> m Int
Buffer -> m Bool
Buffer -> m Int
Buffer -> Bool -> Map Text Object -> m Window
Buffer -> Bool -> Map Text Object -> m Bool
Buffer -> Int -> m Int
Buffer -> Int -> m ()
Buffer -> Int -> m Text
Buffer -> Int -> Int -> Bool -> m [Text]
Buffer -> Int -> Int -> Bool -> m [Text]
Buffer -> Int -> Int -> Bool -> Bool -> m [Text]
Buffer -> Int -> Int -> Bool -> Bool -> [Text] -> m ()
Buffer -> Int -> Int -> Bool -> [Text] -> m ()
Buffer -> Int -> Int -> Bool -> [Text] -> m ()
Buffer -> Int -> Int -> Int -> m ()
Buffer -> Int -> Int -> Int -> m ()
Buffer -> Int -> Int -> Int -> m ()
Buffer -> Int -> Int -> [Object] -> Map Text Object -> m Int
Buffer -> Int -> [Text] -> m ()
Buffer -> Int -> Text -> m ()
Buffer -> Int -> Text -> Int -> Int -> Int -> m Int
Buffer -> Int -> Text -> Int -> Int -> Int -> m Int
Buffer -> Text -> m (Int, Int)
Buffer -> Text -> m ()
Buffer -> Text -> m a
Buffer -> Text -> m a
Buffer -> Text -> m (Int, Int)
Buffer -> Text -> m ()
Buffer -> Text -> m a
Buffer -> Text -> m a
Buffer -> Text -> m ()
Buffer -> Text -> m [Map Text Object]
Buffer -> Text -> m a
Buffer -> Text -> Text -> m ()
Buffer -> Text -> Text -> Text -> Map Text Object -> m ()
Buffer -> Text -> Object -> m ()
Buffer -> Text -> Object -> m ()
Buffer -> Text -> Object -> m a
Buffer -> Text -> Object -> m ()
Buffer -> Map Text Object -> m (Map Text Object)
windowIsValid :: Window -> m Bool
windowGetTabpage :: Window -> m Tabpage
windowGetPosition :: Window -> m (Int, Int)
windowSetOption :: Window -> Text -> Object -> m ()
windowGetOption :: Window -> Text -> m a
windowGetVar :: Window -> Text -> m a
windowSetWidth :: Window -> Int -> m ()
windowGetWidth :: Window -> m Int
windowSetHeight :: Window -> Int -> m ()
windowGetHeight :: Window -> m Int
windowSetCursor :: Window -> (Int, Int) -> m ()
windowGetCursor :: Window -> m (Int, Int)
windowGetBuffer :: Window -> m Buffer
vimGetApiInfo :: m [Object]
vimGetColorMap :: m (Map Text Object)
vimNameToColor :: Text -> m Int
vimUnsubscribe :: Text -> m ()
vimSubscribe :: Text -> m ()
vimSetCurrentTabpage :: Tabpage -> m ()
vimGetCurrentTabpage :: m Tabpage
vimGetTabpages :: m [Tabpage]
vimSetCurrentWindow :: Window -> m ()
vimGetCurrentWindow :: m Window
vimGetWindows :: m [Window]
vimSetCurrentBuffer :: Buffer -> m ()
vimGetCurrentBuffer :: m Buffer
vimGetBuffers :: m [Buffer]
vimReportError :: Text -> m ()
vimErrWrite :: Text -> m ()
vimOutWrite :: Text -> m ()
vimSetOption :: Text -> Object -> m ()
vimGetOption :: Text -> m a
vimGetVvar :: Text -> m a
vimGetVar :: Text -> m a
vimDelCurrentLine :: m ()
vimSetCurrentLine :: Text -> m ()
vimGetCurrentLine :: m Text
vimChangeDirectory :: Text -> m ()
vimListRuntimePaths :: m [Text]
vimStrwidth :: Text -> m Int
vimCallFunction :: Text -> [Object] -> m a
vimEval :: Text -> m a
vimCommandOutput :: Text -> m Text
vimReplaceTermcodes :: Text -> Bool -> Bool -> Bool -> m Text
vimInput :: Text -> m Int
vimFeedkeys :: Text -> Text -> Bool -> m ()
vimCommand :: Text -> m ()
uiTryResize :: Int -> Int -> m a
uiDetach :: m ()
tabpageIsValid :: Tabpage -> m Bool
tabpageGetWindow :: Tabpage -> m Window
tabpageGetVar :: Tabpage -> Text -> m a
tabpageGetWindows :: Tabpage -> m [Window]
bufferClearHighlight :: Buffer -> Int -> Int -> Int -> m ()
bufferAddHighlight :: Buffer -> Int -> Text -> Int -> Int -> Int -> m Int
bufferGetMark :: Buffer -> Text -> m (Int, Int)
bufferIsValid :: Buffer -> m Bool
bufferSetName :: Buffer -> Text -> m ()
bufferGetName :: Buffer -> m Text
bufferGetNumber :: Buffer -> m Int
bufferSetOption :: Buffer -> Text -> Object -> m ()
bufferGetOption :: Buffer -> Text -> m a
bufferGetVar :: Buffer -> Text -> m a
bufferSetLines :: Buffer -> Int -> Int -> Bool -> [Text] -> m ()
bufferGetLines :: Buffer -> Int -> Int -> Bool -> m [Text]
bufferLineCount :: Buffer -> m Int
nvimWinClose :: Window -> Bool -> m ()
nvimWinGetConfig :: Window -> m (Map Text Object)
nvimWinSetConfig :: Window -> Map Text Object -> m ()
nvimWinIsValid :: Window -> m Bool
nvimWinGetNumber :: Window -> m Int
nvimWinGetTabpage :: Window -> m Tabpage
nvimWinGetPosition :: Window -> m (Int, Int)
nvimWinSetOption :: Window -> Text -> Object -> m ()
nvimWinGetOption :: Window -> Text -> m a
windowDelVar :: Window -> Text -> m a
windowSetVar :: Window -> Text -> Object -> m a
nvimWinDelVar :: Window -> Text -> m ()
nvimWinSetVar :: Window -> Text -> Object -> m ()
nvimWinGetVar :: Window -> Text -> m a
nvimWinSetWidth :: Window -> Int -> m ()
nvimWinGetWidth :: Window -> m Int
nvimWinSetHeight :: Window -> Int -> m ()
nvimWinGetHeight :: Window -> m Int
nvimWinSetCursor :: Window -> (Int, Int) -> m ()
nvimWinGetCursor :: Window -> m (Int, Int)
nvimWinSetBuf :: Window -> Buffer -> m ()
nvimWinGetBuf :: Window -> m Buffer
nvimSelectPopupmenuItem :: Int -> Bool -> Bool -> Map Text Object -> m ()
nvimGetProc :: Int -> m a
nvimGetProcChildren :: Int -> m [Object]
nvimListUis :: m [Object]
nvimParseExpression :: Text -> Text -> Bool -> m (Map Text Object)
nvimCallAtomic :: [Object] -> m [Object]
nvimListChans :: m [Object]
nvimGetChanInfo :: Int -> m (Map Text Object)
nvimSetClientInfo :: Text
-> Map Text Object
-> Text
-> Map Text Object
-> Map Text Object
-> m ()
nvimGetApiInfo :: m [Object]
nvimGetCommands :: Map Text Object -> m (Map Text Object)
nvimDelKeymap :: Text -> Text -> m ()
nvimSetKeymap :: Text -> Text -> Text -> Map Text Object -> m ()
nvimGetKeymap :: Text -> m [Map Text Object]
nvimGetMode :: m (Map Text Object)
nvimLoadContext :: Map Text Object -> m a
nvimGetContext :: Map Text Object -> m (Map Text Object)
nvimGetColorMap :: m (Map Text Object)
nvimGetColorByName :: Text -> m Int
nvimUnsubscribe :: Text -> m ()
nvimSubscribe :: Text -> m ()
nvimPut :: [Text] -> Text -> Bool -> Bool -> m ()
nvimPaste :: Text -> Bool -> Int -> m Bool
nvimGetNamespaces :: m (Map Text Object)
nvimCreateNamespace :: Text -> m Int
nvimSetCurrentTabpage :: Tabpage -> m ()
nvimGetCurrentTabpage :: m Tabpage
nvimListTabpages :: m [Tabpage]
nvimOpenWin :: Buffer -> Bool -> Map Text Object -> m Window
nvimCreateBuf :: Bool -> Bool -> m Buffer
nvimSetCurrentWin :: Window -> m ()
nvimGetCurrentWin :: m Window
nvimListWins :: m [Window]
nvimSetCurrentBuf :: Buffer -> m ()
nvimGetCurrentBuf :: m Buffer
nvimListBufs :: m [Buffer]
nvimErrWriteln :: Text -> m ()
nvimErrWrite :: Text -> m ()
nvimOutWrite :: Text -> m ()
nvimSetOption :: Text -> Object -> m ()
nvimGetOption :: Text -> m a
nvimSetVvar :: Text -> Object -> m ()
nvimGetVvar :: Text -> m a
vimDelVar :: Text -> m a
vimSetVar :: Text -> Object -> m a
nvimDelVar :: Text -> m ()
nvimSetVar :: Text -> Object -> m ()
nvimGetVar :: Text -> m a
nvimDelCurrentLine :: m ()
nvimSetCurrentLine :: Text -> m ()
nvimGetCurrentLine :: m Text
nvimSetCurrentDir :: Text -> m ()
nvimListRuntimePaths :: m [Text]
nvimStrwidth :: Text -> m Int
nvimCallDictFunction :: Object -> Text -> [Object] -> m a
nvimCallFunction :: Text -> [Object] -> m a
nvimExecuteLua :: Text -> [Object] -> m a
nvimEval :: Text -> m a
nvimCommandOutput :: Text -> m Text
nvimReplaceTermcodes :: Text -> Bool -> Bool -> Bool -> m Text
nvimInputMouse :: Text -> Text -> Text -> Int -> Int -> Int -> m ()
nvimInput :: Text -> m Int
nvimFeedkeys :: Text -> Text -> Bool -> m ()
nvimGetHlById :: Int -> Bool -> m (Map Text Object)
nvimGetHlByName :: Text -> Bool -> m (Map Text Object)
nvimCommand :: Text -> m ()
nvimUiPumSetHeight :: Int -> m ()
nvimUiTryResizeGrid :: Int -> Int -> Int -> m ()
nvimUiSetOption :: Text -> Object -> m ()
nvimUiTryResize :: Int -> Int -> m ()
nvimUiDetach :: m ()
uiAttach :: Int -> Int -> Bool -> m ()
nvimUiAttach :: Int -> Int -> Map Text Object -> m ()
nvimTabpageIsValid :: Tabpage -> m Bool
nvimTabpageGetNumber :: Tabpage -> m Int
nvimTabpageGetWin :: Tabpage -> m Window
tabpageDelVar :: Tabpage -> Text -> m a
tabpageSetVar :: Tabpage -> Text -> Object -> m a
nvimTabpageDelVar :: Tabpage -> Text -> m ()
nvimTabpageSetVar :: Tabpage -> Text -> Object -> m ()
nvimTabpageGetVar :: Tabpage -> Text -> m a
nvimTabpageListWins :: Tabpage -> m [Window]
nvimBufSetVirtualText :: Buffer -> Int -> Int -> [Object] -> Map Text Object -> m Int
nvimBufClearHighlight :: Buffer -> Int -> Int -> Int -> m ()
nvimBufClearNamespace :: Buffer -> Int -> Int -> Int -> m ()
nvimBufAddHighlight :: Buffer -> Int -> Text -> Int -> Int -> Int -> m Int
nvimBufGetMark :: Buffer -> Text -> m (Int, Int)
bufferInsert :: Buffer -> Int -> [Text] -> m ()
nvimBufIsValid :: Buffer -> m Bool
nvimBufIsLoaded :: Buffer -> m Bool
nvimBufSetName :: Buffer -> Text -> m ()
nvimBufGetName :: Buffer -> m Text
nvimBufGetNumber :: Buffer -> m Int
nvimBufSetOption :: Buffer -> Text -> Object -> m ()
nvimBufGetOption :: Buffer -> Text -> m a
bufferDelVar :: Buffer -> Text -> m a
bufferSetVar :: Buffer -> Text -> Object -> m a
nvimBufDelVar :: Buffer -> Text -> m ()
nvimBufSetVar :: Buffer -> Text -> Object -> m ()
nvimBufGetCommands :: Buffer -> Map Text Object -> m (Map Text Object)
nvimBufDelKeymap :: Buffer -> Text -> Text -> m ()
nvimBufSetKeymap :: Buffer -> Text -> Text -> Text -> Map Text Object -> m ()
nvimBufGetKeymap :: Buffer -> Text -> m [Map Text Object]
nvimBufGetChangedtick :: Buffer -> m Int
nvimBufGetVar :: Buffer -> Text -> m a
nvimBufGetOffset :: Buffer -> Int -> m Int
nvimBufSetLines :: Buffer -> Int -> Int -> Bool -> [Text] -> m ()
bufferSetLineSlice :: Buffer -> Int -> Int -> Bool -> Bool -> [Text] -> m ()
nvimBufGetLines :: Buffer -> Int -> Int -> Bool -> m [Text]
bufferGetLineSlice :: Buffer -> Int -> Int -> Bool -> Bool -> m [Text]
bufferDelLine :: Buffer -> Int -> m ()
bufferSetLine :: Buffer -> Int -> Text -> m ()
nvimBufDetach :: Buffer -> m Bool
nvimBufAttach :: Buffer -> Bool -> Map Text Object -> m Bool
bufferGetLine :: Buffer -> Int -> m Text
nvimBufLineCount :: Buffer -> m Int
generateIO