module Ribosome.Menu.Prompt.Data.PromptState where

data PromptState =
  Insert
  |
  Normal
  |
  Quit
  deriving (PromptState -> PromptState -> Bool
(PromptState -> PromptState -> Bool)
-> (PromptState -> PromptState -> Bool) -> Eq PromptState
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: PromptState -> PromptState -> Bool
$c/= :: PromptState -> PromptState -> Bool
== :: PromptState -> PromptState -> Bool
$c== :: PromptState -> PromptState -> Bool
Eq, Int -> PromptState -> ShowS
[PromptState] -> ShowS
PromptState -> String
(Int -> PromptState -> ShowS)
-> (PromptState -> String)
-> ([PromptState] -> ShowS)
-> Show PromptState
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [PromptState] -> ShowS
$cshowList :: [PromptState] -> ShowS
show :: PromptState -> String
$cshow :: PromptState -> String
showsPrec :: Int -> PromptState -> ShowS
$cshowsPrec :: Int -> PromptState -> ShowS
Show)

deepLenses ''PromptState