module Ribosome.Data.ScratchState where
import Ribosome.Data.ScratchId (ScratchId)
import Ribosome.Data.ScratchOptions (ScratchOptions)
import Ribosome.Host.Api.Data (Buffer, Tabpage, Window)
import Ribosome.Host.Data.RpcType (AutocmdId)
data ScratchState =
ScratchState {
ScratchState -> ScratchId
id :: ScratchId,
ScratchState -> ScratchOptions
options :: ScratchOptions,
ScratchState -> Buffer
buffer :: Buffer,
ScratchState -> Window
window :: Window,
ScratchState -> Window
previous :: Window,
ScratchState -> Maybe Tabpage
tab :: Maybe Tabpage,
ScratchState -> AutocmdId
autocmdId :: AutocmdId
}
deriving stock (ScratchState -> ScratchState -> Bool
(ScratchState -> ScratchState -> Bool)
-> (ScratchState -> ScratchState -> Bool) -> Eq ScratchState
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ScratchState -> ScratchState -> Bool
$c/= :: ScratchState -> ScratchState -> Bool
== :: ScratchState -> ScratchState -> Bool
$c== :: ScratchState -> ScratchState -> Bool
Eq, Int -> ScratchState -> ShowS
[ScratchState] -> ShowS
ScratchState -> String
(Int -> ScratchState -> ShowS)
-> (ScratchState -> String)
-> ([ScratchState] -> ShowS)
-> Show ScratchState
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ScratchState] -> ShowS
$cshowList :: [ScratchState] -> ShowS
show :: ScratchState -> String
$cshow :: ScratchState -> String
showsPrec :: Int -> ScratchState -> ShowS
$cshowsPrec :: Int -> ScratchState -> ShowS
Show, (forall x. ScratchState -> Rep ScratchState x)
-> (forall x. Rep ScratchState x -> ScratchState)
-> Generic ScratchState
forall x. Rep ScratchState x -> ScratchState
forall x. ScratchState -> Rep ScratchState x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep ScratchState x -> ScratchState
$cfrom :: forall x. ScratchState -> Rep ScratchState x
Generic)