{-# LANGUAGE DeriveGeneric #-}
module Telegram.Bot.API.Types.ParseMode where

import Data.Aeson
import GHC.Generics (Generic)

data ParseMode
  = Markdown
  | HTML
  | MarkdownV2
  deriving ((forall x. ParseMode -> Rep ParseMode x)
-> (forall x. Rep ParseMode x -> ParseMode) -> Generic ParseMode
forall x. Rep ParseMode x -> ParseMode
forall x. ParseMode -> Rep ParseMode x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. ParseMode -> Rep ParseMode x
from :: forall x. ParseMode -> Rep ParseMode x
$cto :: forall x. Rep ParseMode x -> ParseMode
to :: forall x. Rep ParseMode x -> ParseMode
Generic, Int -> ParseMode -> ShowS
[ParseMode] -> ShowS
ParseMode -> String
(Int -> ParseMode -> ShowS)
-> (ParseMode -> String)
-> ([ParseMode] -> ShowS)
-> Show ParseMode
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ParseMode -> ShowS
showsPrec :: Int -> ParseMode -> ShowS
$cshow :: ParseMode -> String
show :: ParseMode -> String
$cshowList :: [ParseMode] -> ShowS
showList :: [ParseMode] -> ShowS
Show)

instance ToJSON   ParseMode
instance FromJSON ParseMode