module Ribosome.Menu.Prompt.Data.TextUpdate where

data TextUpdate =
  Unmodified
  |
  Insert Text
  |
  DeleteLeft
  |
  DeleteRight
  |
  Set Text
  deriving (TextUpdate -> TextUpdate -> Bool
(TextUpdate -> TextUpdate -> Bool)
-> (TextUpdate -> TextUpdate -> Bool) -> Eq TextUpdate
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: TextUpdate -> TextUpdate -> Bool
$c/= :: TextUpdate -> TextUpdate -> Bool
== :: TextUpdate -> TextUpdate -> Bool
$c== :: TextUpdate -> TextUpdate -> Bool
Eq, Int -> TextUpdate -> ShowS
[TextUpdate] -> ShowS
TextUpdate -> String
(Int -> TextUpdate -> ShowS)
-> (TextUpdate -> String)
-> ([TextUpdate] -> ShowS)
-> Show TextUpdate
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [TextUpdate] -> ShowS
$cshowList :: [TextUpdate] -> ShowS
show :: TextUpdate -> String
$cshow :: TextUpdate -> String
showsPrec :: Int -> TextUpdate -> ShowS
$cshowsPrec :: Int -> TextUpdate -> ShowS
Show)