module Ribosome.Plugin.RpcHandler where

import Neovim (Neovim)

class RpcHandler e env m | m -> e env where
  native :: m a -> ExceptT e (Neovim env) a

instance RpcHandler e env (ExceptT e (Neovim env)) where
  native :: ExceptT e (Neovim env) a -> ExceptT e (Neovim env) a
native = ExceptT e (Neovim env) a -> ExceptT e (Neovim env) a
forall a. a -> a
id