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

import Data.Aeson
import GHC.Generics (Generic)

data ParseMode
  = Markdown
  | HTML
  | MarkdownV2
  deriving (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
$cto :: forall x. Rep ParseMode x -> ParseMode
$cfrom :: forall x. ParseMode -> Rep ParseMode x
Generic)

instance ToJSON   ParseMode
instance FromJSON ParseMode