module Ribosome.Menu.Prompt.Data.CursorUpdate where

data CursorUpdate =
  Unmodified
  |
  OneLeft
  |
  OneRight
  |
  Append
  |
  Prepend
  |
  Index Int
  deriving (CursorUpdate -> CursorUpdate -> Bool
(CursorUpdate -> CursorUpdate -> Bool)
-> (CursorUpdate -> CursorUpdate -> Bool) -> Eq CursorUpdate
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: CursorUpdate -> CursorUpdate -> Bool
$c/= :: CursorUpdate -> CursorUpdate -> Bool
== :: CursorUpdate -> CursorUpdate -> Bool
$c== :: CursorUpdate -> CursorUpdate -> Bool
Eq, Int -> CursorUpdate -> ShowS
[CursorUpdate] -> ShowS
CursorUpdate -> String
(Int -> CursorUpdate -> ShowS)
-> (CursorUpdate -> String)
-> ([CursorUpdate] -> ShowS)
-> Show CursorUpdate
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [CursorUpdate] -> ShowS
$cshowList :: [CursorUpdate] -> ShowS
show :: CursorUpdate -> String
$cshow :: CursorUpdate -> String
showsPrec :: Int -> CursorUpdate -> ShowS
$cshowsPrec :: Int -> CursorUpdate -> ShowS
Show)