{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TypeApplications #-}
module Telegram.Bot.API.Types.Common where
import Data.Aeson (FromJSON (..), ToJSON (..), KeyValue ((.=)))
import Data.Aeson.Types (Pair)
import Data.Coerce (coerce)
import Data.Hashable (Hashable)
import Data.Text (Text, pack)
import GHC.Generics (Generic)
import Servant.API (ToHttpApiData (..))
import Telegram.Bot.API.Internal.Utils
newtype FileId = FileId Text
  deriving (FileId -> FileId -> Bool
(FileId -> FileId -> Bool)
-> (FileId -> FileId -> Bool) -> Eq FileId
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: FileId -> FileId -> Bool
== :: FileId -> FileId -> Bool
$c/= :: FileId -> FileId -> Bool
/= :: FileId -> FileId -> Bool
Eq, Int -> FileId -> ShowS
[FileId] -> ShowS
FileId -> String
(Int -> FileId -> ShowS)
-> (FileId -> String) -> ([FileId] -> ShowS) -> Show FileId
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> FileId -> ShowS
showsPrec :: Int -> FileId -> ShowS
$cshow :: FileId -> String
show :: FileId -> String
$cshowList :: [FileId] -> ShowS
showList :: [FileId] -> ShowS
Show, [FileId] -> Value
[FileId] -> Encoding
FileId -> Bool
FileId -> Value
FileId -> Encoding
(FileId -> Value)
-> (FileId -> Encoding)
-> ([FileId] -> Value)
-> ([FileId] -> Encoding)
-> (FileId -> Bool)
-> ToJSON FileId
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> (a -> Bool)
-> ToJSON a
$ctoJSON :: FileId -> Value
toJSON :: FileId -> Value
$ctoEncoding :: FileId -> Encoding
toEncoding :: FileId -> Encoding
$ctoJSONList :: [FileId] -> Value
toJSONList :: [FileId] -> Value
$ctoEncodingList :: [FileId] -> Encoding
toEncodingList :: [FileId] -> Encoding
$comitField :: FileId -> Bool
omitField :: FileId -> Bool
ToJSON, Maybe FileId
Value -> Parser [FileId]
Value -> Parser FileId
(Value -> Parser FileId)
-> (Value -> Parser [FileId]) -> Maybe FileId -> FromJSON FileId
forall a.
(Value -> Parser a)
-> (Value -> Parser [a]) -> Maybe a -> FromJSON a
$cparseJSON :: Value -> Parser FileId
parseJSON :: Value -> Parser FileId
$cparseJSONList :: Value -> Parser [FileId]
parseJSONList :: Value -> Parser [FileId]
$comittedField :: Maybe FileId
omittedField :: Maybe FileId
FromJSON)
instance ToHttpApiData FileId where
  toUrlPiece :: FileId -> Text
toUrlPiece = FileId -> Text
forall a b. Coercible a b => a -> b
coerce
newtype Seconds = Seconds Int
  deriving (Seconds -> Seconds -> Bool
(Seconds -> Seconds -> Bool)
-> (Seconds -> Seconds -> Bool) -> Eq Seconds
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Seconds -> Seconds -> Bool
== :: Seconds -> Seconds -> Bool
$c/= :: Seconds -> Seconds -> Bool
/= :: Seconds -> Seconds -> Bool
Eq, Int -> Seconds -> ShowS
[Seconds] -> ShowS
Seconds -> String
(Int -> Seconds -> ShowS)
-> (Seconds -> String) -> ([Seconds] -> ShowS) -> Show Seconds
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Seconds -> ShowS
showsPrec :: Int -> Seconds -> ShowS
$cshow :: Seconds -> String
show :: Seconds -> String
$cshowList :: [Seconds] -> ShowS
showList :: [Seconds] -> ShowS
Show, Integer -> Seconds
Seconds -> Seconds
Seconds -> Seconds -> Seconds
(Seconds -> Seconds -> Seconds)
-> (Seconds -> Seconds -> Seconds)
-> (Seconds -> Seconds -> Seconds)
-> (Seconds -> Seconds)
-> (Seconds -> Seconds)
-> (Seconds -> Seconds)
-> (Integer -> Seconds)
-> Num Seconds
forall a.
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a)
-> (a -> a)
-> (a -> a)
-> (Integer -> a)
-> Num a
$c+ :: Seconds -> Seconds -> Seconds
+ :: Seconds -> Seconds -> Seconds
$c- :: Seconds -> Seconds -> Seconds
- :: Seconds -> Seconds -> Seconds
$c* :: Seconds -> Seconds -> Seconds
* :: Seconds -> Seconds -> Seconds
$cnegate :: Seconds -> Seconds
negate :: Seconds -> Seconds
$cabs :: Seconds -> Seconds
abs :: Seconds -> Seconds
$csignum :: Seconds -> Seconds
signum :: Seconds -> Seconds
$cfromInteger :: Integer -> Seconds
fromInteger :: Integer -> Seconds
Num, [Seconds] -> Value
[Seconds] -> Encoding
Seconds -> Bool
Seconds -> Value
Seconds -> Encoding
(Seconds -> Value)
-> (Seconds -> Encoding)
-> ([Seconds] -> Value)
-> ([Seconds] -> Encoding)
-> (Seconds -> Bool)
-> ToJSON Seconds
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> (a -> Bool)
-> ToJSON a
$ctoJSON :: Seconds -> Value
toJSON :: Seconds -> Value
$ctoEncoding :: Seconds -> Encoding
toEncoding :: Seconds -> Encoding
$ctoJSONList :: [Seconds] -> Value
toJSONList :: [Seconds] -> Value
$ctoEncodingList :: [Seconds] -> Encoding
toEncodingList :: [Seconds] -> Encoding
$comitField :: Seconds -> Bool
omitField :: Seconds -> Bool
ToJSON, Maybe Seconds
Value -> Parser [Seconds]
Value -> Parser Seconds
(Value -> Parser Seconds)
-> (Value -> Parser [Seconds]) -> Maybe Seconds -> FromJSON Seconds
forall a.
(Value -> Parser a)
-> (Value -> Parser [a]) -> Maybe a -> FromJSON a
$cparseJSON :: Value -> Parser Seconds
parseJSON :: Value -> Parser Seconds
$cparseJSONList :: Value -> Parser [Seconds]
parseJSONList :: Value -> Parser [Seconds]
$comittedField :: Maybe Seconds
omittedField :: Maybe Seconds
FromJSON)
newtype UserId = UserId Integer
  deriving (UserId -> UserId -> Bool
(UserId -> UserId -> Bool)
-> (UserId -> UserId -> Bool) -> Eq UserId
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: UserId -> UserId -> Bool
== :: UserId -> UserId -> Bool
$c/= :: UserId -> UserId -> Bool
/= :: UserId -> UserId -> Bool
Eq, Int -> UserId -> ShowS
[UserId] -> ShowS
UserId -> String
(Int -> UserId -> ShowS)
-> (UserId -> String) -> ([UserId] -> ShowS) -> Show UserId
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> UserId -> ShowS
showsPrec :: Int -> UserId -> ShowS
$cshow :: UserId -> String
show :: UserId -> String
$cshowList :: [UserId] -> ShowS
showList :: [UserId] -> ShowS
Show, [UserId] -> Value
[UserId] -> Encoding
UserId -> Bool
UserId -> Value
UserId -> Encoding
(UserId -> Value)
-> (UserId -> Encoding)
-> ([UserId] -> Value)
-> ([UserId] -> Encoding)
-> (UserId -> Bool)
-> ToJSON UserId
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> (a -> Bool)
-> ToJSON a
$ctoJSON :: UserId -> Value
toJSON :: UserId -> Value
$ctoEncoding :: UserId -> Encoding
toEncoding :: UserId -> Encoding
$ctoJSONList :: [UserId] -> Value
toJSONList :: [UserId] -> Value
$ctoEncodingList :: [UserId] -> Encoding
toEncodingList :: [UserId] -> Encoding
$comitField :: UserId -> Bool
omitField :: UserId -> Bool
ToJSON, Maybe UserId
Value -> Parser [UserId]
Value -> Parser UserId
(Value -> Parser UserId)
-> (Value -> Parser [UserId]) -> Maybe UserId -> FromJSON UserId
forall a.
(Value -> Parser a)
-> (Value -> Parser [a]) -> Maybe a -> FromJSON a
$cparseJSON :: Value -> Parser UserId
parseJSON :: Value -> Parser UserId
$cparseJSONList :: Value -> Parser [UserId]
parseJSONList :: Value -> Parser [UserId]
$comittedField :: Maybe UserId
omittedField :: Maybe UserId
FromJSON)
instance ToHttpApiData UserId where
  toUrlPiece :: UserId -> Text
toUrlPiece = String -> Text
pack (String -> Text) -> (UserId -> String) -> UserId -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Show a => a -> String
show @Integer (Integer -> String) -> (UserId -> Integer) -> UserId -> String
forall b c a. (b -> c) -> (a -> b) -> a -> c
. UserId -> Integer
forall a b. Coercible a b => a -> b
coerce
newtype BoostId = BoostId Text
  deriving (BoostId -> BoostId -> Bool
(BoostId -> BoostId -> Bool)
-> (BoostId -> BoostId -> Bool) -> Eq BoostId
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: BoostId -> BoostId -> Bool
== :: BoostId -> BoostId -> Bool
$c/= :: BoostId -> BoostId -> Bool
/= :: BoostId -> BoostId -> Bool
Eq, Int -> BoostId -> ShowS
[BoostId] -> ShowS
BoostId -> String
(Int -> BoostId -> ShowS)
-> (BoostId -> String) -> ([BoostId] -> ShowS) -> Show BoostId
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> BoostId -> ShowS
showsPrec :: Int -> BoostId -> ShowS
$cshow :: BoostId -> String
show :: BoostId -> String
$cshowList :: [BoostId] -> ShowS
showList :: [BoostId] -> ShowS
Show, (forall x. BoostId -> Rep BoostId x)
-> (forall x. Rep BoostId x -> BoostId) -> Generic BoostId
forall x. Rep BoostId x -> BoostId
forall x. BoostId -> Rep BoostId x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. BoostId -> Rep BoostId x
from :: forall x. BoostId -> Rep BoostId x
$cto :: forall x. Rep BoostId x -> BoostId
to :: forall x. Rep BoostId x -> BoostId
Generic, [BoostId] -> Value
[BoostId] -> Encoding
BoostId -> Bool
BoostId -> Value
BoostId -> Encoding
(BoostId -> Value)
-> (BoostId -> Encoding)
-> ([BoostId] -> Value)
-> ([BoostId] -> Encoding)
-> (BoostId -> Bool)
-> ToJSON BoostId
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> (a -> Bool)
-> ToJSON a
$ctoJSON :: BoostId -> Value
toJSON :: BoostId -> Value
$ctoEncoding :: BoostId -> Encoding
toEncoding :: BoostId -> Encoding
$ctoJSONList :: [BoostId] -> Value
toJSONList :: [BoostId] -> Value
$ctoEncodingList :: [BoostId] -> Encoding
toEncodingList :: [BoostId] -> Encoding
$comitField :: BoostId -> Bool
omitField :: BoostId -> Bool
ToJSON, Maybe BoostId
Value -> Parser [BoostId]
Value -> Parser BoostId
(Value -> Parser BoostId)
-> (Value -> Parser [BoostId]) -> Maybe BoostId -> FromJSON BoostId
forall a.
(Value -> Parser a)
-> (Value -> Parser [a]) -> Maybe a -> FromJSON a
$cparseJSON :: Value -> Parser BoostId
parseJSON :: Value -> Parser BoostId
$cparseJSONList :: Value -> Parser [BoostId]
parseJSONList :: Value -> Parser [BoostId]
$comittedField :: Maybe BoostId
omittedField :: Maybe BoostId
FromJSON)
newtype ChatId = ChatId Integer
  deriving (ChatId -> ChatId -> Bool
(ChatId -> ChatId -> Bool)
-> (ChatId -> ChatId -> Bool) -> Eq ChatId
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ChatId -> ChatId -> Bool
== :: ChatId -> ChatId -> Bool
$c/= :: ChatId -> ChatId -> Bool
/= :: ChatId -> ChatId -> Bool
Eq, Int -> ChatId -> ShowS
[ChatId] -> ShowS
ChatId -> String
(Int -> ChatId -> ShowS)
-> (ChatId -> String) -> ([ChatId] -> ShowS) -> Show ChatId
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ChatId -> ShowS
showsPrec :: Int -> ChatId -> ShowS
$cshow :: ChatId -> String
show :: ChatId -> String
$cshowList :: [ChatId] -> ShowS
showList :: [ChatId] -> ShowS
Show, [ChatId] -> Value
[ChatId] -> Encoding
ChatId -> Bool
ChatId -> Value
ChatId -> Encoding
(ChatId -> Value)
-> (ChatId -> Encoding)
-> ([ChatId] -> Value)
-> ([ChatId] -> Encoding)
-> (ChatId -> Bool)
-> ToJSON ChatId
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> (a -> Bool)
-> ToJSON a
$ctoJSON :: ChatId -> Value
toJSON :: ChatId -> Value
$ctoEncoding :: ChatId -> Encoding
toEncoding :: ChatId -> Encoding
$ctoJSONList :: [ChatId] -> Value
toJSONList :: [ChatId] -> Value
$ctoEncodingList :: [ChatId] -> Encoding
toEncodingList :: [ChatId] -> Encoding
$comitField :: ChatId -> Bool
omitField :: ChatId -> Bool
ToJSON, Maybe ChatId
Value -> Parser [ChatId]
Value -> Parser ChatId
(Value -> Parser ChatId)
-> (Value -> Parser [ChatId]) -> Maybe ChatId -> FromJSON ChatId
forall a.
(Value -> Parser a)
-> (Value -> Parser [a]) -> Maybe a -> FromJSON a
$cparseJSON :: Value -> Parser ChatId
parseJSON :: Value -> Parser ChatId
$cparseJSONList :: Value -> Parser [ChatId]
parseJSONList :: Value -> Parser [ChatId]
$comittedField :: Maybe ChatId
omittedField :: Maybe ChatId
FromJSON, Eq ChatId
Eq ChatId =>
(Int -> ChatId -> Int) -> (ChatId -> Int) -> Hashable ChatId
Int -> ChatId -> Int
ChatId -> Int
forall a. Eq a => (Int -> a -> Int) -> (a -> Int) -> Hashable a
$chashWithSalt :: Int -> ChatId -> Int
hashWithSalt :: Int -> ChatId -> Int
$chash :: ChatId -> Int
hash :: ChatId -> Int
Hashable)
instance ToHttpApiData ChatId where
  toUrlPiece :: ChatId -> Text
toUrlPiece ChatId
a = String -> Text
pack (String -> Text) -> (Integer -> String) -> Integer -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Show a => a -> String
show @Integer (Integer -> Text) -> Integer -> Text
forall a b. (a -> b) -> a -> b
$ ChatId -> Integer
forall a b. Coercible a b => a -> b
coerce ChatId
a
newtype MessageId = MessageId Integer
  deriving (MessageId -> MessageId -> Bool
(MessageId -> MessageId -> Bool)
-> (MessageId -> MessageId -> Bool) -> Eq MessageId
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: MessageId -> MessageId -> Bool
== :: MessageId -> MessageId -> Bool
$c/= :: MessageId -> MessageId -> Bool
/= :: MessageId -> MessageId -> Bool
Eq, Int -> MessageId -> ShowS
[MessageId] -> ShowS
MessageId -> String
(Int -> MessageId -> ShowS)
-> (MessageId -> String)
-> ([MessageId] -> ShowS)
-> Show MessageId
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> MessageId -> ShowS
showsPrec :: Int -> MessageId -> ShowS
$cshow :: MessageId -> String
show :: MessageId -> String
$cshowList :: [MessageId] -> ShowS
showList :: [MessageId] -> ShowS
Show, [MessageId] -> Value
[MessageId] -> Encoding
MessageId -> Bool
MessageId -> Value
MessageId -> Encoding
(MessageId -> Value)
-> (MessageId -> Encoding)
-> ([MessageId] -> Value)
-> ([MessageId] -> Encoding)
-> (MessageId -> Bool)
-> ToJSON MessageId
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> (a -> Bool)
-> ToJSON a
$ctoJSON :: MessageId -> Value
toJSON :: MessageId -> Value
$ctoEncoding :: MessageId -> Encoding
toEncoding :: MessageId -> Encoding
$ctoJSONList :: [MessageId] -> Value
toJSONList :: [MessageId] -> Value
$ctoEncodingList :: [MessageId] -> Encoding
toEncodingList :: [MessageId] -> Encoding
$comitField :: MessageId -> Bool
omitField :: MessageId -> Bool
ToJSON, Maybe MessageId
Value -> Parser [MessageId]
Value -> Parser MessageId
(Value -> Parser MessageId)
-> (Value -> Parser [MessageId])
-> Maybe MessageId
-> FromJSON MessageId
forall a.
(Value -> Parser a)
-> (Value -> Parser [a]) -> Maybe a -> FromJSON a
$cparseJSON :: Value -> Parser MessageId
parseJSON :: Value -> Parser MessageId
$cparseJSONList :: Value -> Parser [MessageId]
parseJSONList :: Value -> Parser [MessageId]
$comittedField :: Maybe MessageId
omittedField :: Maybe MessageId
FromJSON, Eq MessageId
Eq MessageId =>
(Int -> MessageId -> Int)
-> (MessageId -> Int) -> Hashable MessageId
Int -> MessageId -> Int
MessageId -> Int
forall a. Eq a => (Int -> a -> Int) -> (a -> Int) -> Hashable a
$chashWithSalt :: Int -> MessageId -> Int
hashWithSalt :: Int -> MessageId -> Int
$chash :: MessageId -> Int
hash :: MessageId -> Int
Hashable)
instance ToHttpApiData MessageId where
  toUrlPiece :: MessageId -> Text
toUrlPiece MessageId
a = String -> Text
pack (String -> Text) -> (Integer -> String) -> Integer -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Show a => a -> String
show @Integer (Integer -> Text) -> Integer -> Text
forall a b. (a -> b) -> a -> b
$ MessageId -> Integer
forall a b. Coercible a b => a -> b
coerce MessageId
a
newtype MessageThreadId = MessageThreadId Integer
  deriving (MessageThreadId -> MessageThreadId -> Bool
(MessageThreadId -> MessageThreadId -> Bool)
-> (MessageThreadId -> MessageThreadId -> Bool)
-> Eq MessageThreadId
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: MessageThreadId -> MessageThreadId -> Bool
== :: MessageThreadId -> MessageThreadId -> Bool
$c/= :: MessageThreadId -> MessageThreadId -> Bool
/= :: MessageThreadId -> MessageThreadId -> Bool
Eq, Int -> MessageThreadId -> ShowS
[MessageThreadId] -> ShowS
MessageThreadId -> String
(Int -> MessageThreadId -> ShowS)
-> (MessageThreadId -> String)
-> ([MessageThreadId] -> ShowS)
-> Show MessageThreadId
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> MessageThreadId -> ShowS
showsPrec :: Int -> MessageThreadId -> ShowS
$cshow :: MessageThreadId -> String
show :: MessageThreadId -> String
$cshowList :: [MessageThreadId] -> ShowS
showList :: [MessageThreadId] -> ShowS
Show, [MessageThreadId] -> Value
[MessageThreadId] -> Encoding
MessageThreadId -> Bool
MessageThreadId -> Value
MessageThreadId -> Encoding
(MessageThreadId -> Value)
-> (MessageThreadId -> Encoding)
-> ([MessageThreadId] -> Value)
-> ([MessageThreadId] -> Encoding)
-> (MessageThreadId -> Bool)
-> ToJSON MessageThreadId
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> (a -> Bool)
-> ToJSON a
$ctoJSON :: MessageThreadId -> Value
toJSON :: MessageThreadId -> Value
$ctoEncoding :: MessageThreadId -> Encoding
toEncoding :: MessageThreadId -> Encoding
$ctoJSONList :: [MessageThreadId] -> Value
toJSONList :: [MessageThreadId] -> Value
$ctoEncodingList :: [MessageThreadId] -> Encoding
toEncodingList :: [MessageThreadId] -> Encoding
$comitField :: MessageThreadId -> Bool
omitField :: MessageThreadId -> Bool
ToJSON, Maybe MessageThreadId
Value -> Parser [MessageThreadId]
Value -> Parser MessageThreadId
(Value -> Parser MessageThreadId)
-> (Value -> Parser [MessageThreadId])
-> Maybe MessageThreadId
-> FromJSON MessageThreadId
forall a.
(Value -> Parser a)
-> (Value -> Parser [a]) -> Maybe a -> FromJSON a
$cparseJSON :: Value -> Parser MessageThreadId
parseJSON :: Value -> Parser MessageThreadId
$cparseJSONList :: Value -> Parser [MessageThreadId]
parseJSONList :: Value -> Parser [MessageThreadId]
$comittedField :: Maybe MessageThreadId
omittedField :: Maybe MessageThreadId
FromJSON, Eq MessageThreadId
Eq MessageThreadId =>
(Int -> MessageThreadId -> Int)
-> (MessageThreadId -> Int) -> Hashable MessageThreadId
Int -> MessageThreadId -> Int
MessageThreadId -> Int
forall a. Eq a => (Int -> a -> Int) -> (a -> Int) -> Hashable a
$chashWithSalt :: Int -> MessageThreadId -> Int
hashWithSalt :: Int -> MessageThreadId -> Int
$chash :: MessageThreadId -> Int
hash :: MessageThreadId -> Int
Hashable)
instance ToHttpApiData MessageThreadId where
  toUrlPiece :: MessageThreadId -> Text
toUrlPiece MessageThreadId
a = String -> Text
pack (String -> Text) -> (Integer -> String) -> Integer -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Show a => a -> String
show @Integer (Integer -> Text) -> Integer -> Text
forall a b. (a -> b) -> a -> b
$ MessageThreadId -> Integer
forall a b. Coercible a b => a -> b
coerce MessageThreadId
a
newtype InlineMessageId = InlineMessageId Text
  deriving (InlineMessageId -> InlineMessageId -> Bool
(InlineMessageId -> InlineMessageId -> Bool)
-> (InlineMessageId -> InlineMessageId -> Bool)
-> Eq InlineMessageId
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: InlineMessageId -> InlineMessageId -> Bool
== :: InlineMessageId -> InlineMessageId -> Bool
$c/= :: InlineMessageId -> InlineMessageId -> Bool
/= :: InlineMessageId -> InlineMessageId -> Bool
Eq, Int -> InlineMessageId -> ShowS
[InlineMessageId] -> ShowS
InlineMessageId -> String
(Int -> InlineMessageId -> ShowS)
-> (InlineMessageId -> String)
-> ([InlineMessageId] -> ShowS)
-> Show InlineMessageId
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> InlineMessageId -> ShowS
showsPrec :: Int -> InlineMessageId -> ShowS
$cshow :: InlineMessageId -> String
show :: InlineMessageId -> String
$cshowList :: [InlineMessageId] -> ShowS
showList :: [InlineMessageId] -> ShowS
Show, [InlineMessageId] -> Value
[InlineMessageId] -> Encoding
InlineMessageId -> Bool
InlineMessageId -> Value
InlineMessageId -> Encoding
(InlineMessageId -> Value)
-> (InlineMessageId -> Encoding)
-> ([InlineMessageId] -> Value)
-> ([InlineMessageId] -> Encoding)
-> (InlineMessageId -> Bool)
-> ToJSON InlineMessageId
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> (a -> Bool)
-> ToJSON a
$ctoJSON :: InlineMessageId -> Value
toJSON :: InlineMessageId -> Value
$ctoEncoding :: InlineMessageId -> Encoding
toEncoding :: InlineMessageId -> Encoding
$ctoJSONList :: [InlineMessageId] -> Value
toJSONList :: [InlineMessageId] -> Value
$ctoEncodingList :: [InlineMessageId] -> Encoding
toEncodingList :: [InlineMessageId] -> Encoding
$comitField :: InlineMessageId -> Bool
omitField :: InlineMessageId -> Bool
ToJSON, Maybe InlineMessageId
Value -> Parser [InlineMessageId]
Value -> Parser InlineMessageId
(Value -> Parser InlineMessageId)
-> (Value -> Parser [InlineMessageId])
-> Maybe InlineMessageId
-> FromJSON InlineMessageId
forall a.
(Value -> Parser a)
-> (Value -> Parser [a]) -> Maybe a -> FromJSON a
$cparseJSON :: Value -> Parser InlineMessageId
parseJSON :: Value -> Parser InlineMessageId
$cparseJSONList :: Value -> Parser [InlineMessageId]
parseJSONList :: Value -> Parser [InlineMessageId]
$comittedField :: Maybe InlineMessageId
omittedField :: Maybe InlineMessageId
FromJSON, Eq InlineMessageId
Eq InlineMessageId =>
(Int -> InlineMessageId -> Int)
-> (InlineMessageId -> Int) -> Hashable InlineMessageId
Int -> InlineMessageId -> Int
InlineMessageId -> Int
forall a. Eq a => (Int -> a -> Int) -> (a -> Int) -> Hashable a
$chashWithSalt :: Int -> InlineMessageId -> Int
hashWithSalt :: Int -> InlineMessageId -> Int
$chash :: InlineMessageId -> Int
hash :: InlineMessageId -> Int
Hashable)
newtype MediaGroupId = MediaGroupId Text
  deriving (MediaGroupId -> MediaGroupId -> Bool
(MediaGroupId -> MediaGroupId -> Bool)
-> (MediaGroupId -> MediaGroupId -> Bool) -> Eq MediaGroupId
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: MediaGroupId -> MediaGroupId -> Bool
== :: MediaGroupId -> MediaGroupId -> Bool
$c/= :: MediaGroupId -> MediaGroupId -> Bool
/= :: MediaGroupId -> MediaGroupId -> Bool
Eq, Int -> MediaGroupId -> ShowS
[MediaGroupId] -> ShowS
MediaGroupId -> String
(Int -> MediaGroupId -> ShowS)
-> (MediaGroupId -> String)
-> ([MediaGroupId] -> ShowS)
-> Show MediaGroupId
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> MediaGroupId -> ShowS
showsPrec :: Int -> MediaGroupId -> ShowS
$cshow :: MediaGroupId -> String
show :: MediaGroupId -> String
$cshowList :: [MediaGroupId] -> ShowS
showList :: [MediaGroupId] -> ShowS
Show, [MediaGroupId] -> Value
[MediaGroupId] -> Encoding
MediaGroupId -> Bool
MediaGroupId -> Value
MediaGroupId -> Encoding
(MediaGroupId -> Value)
-> (MediaGroupId -> Encoding)
-> ([MediaGroupId] -> Value)
-> ([MediaGroupId] -> Encoding)
-> (MediaGroupId -> Bool)
-> ToJSON MediaGroupId
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> (a -> Bool)
-> ToJSON a
$ctoJSON :: MediaGroupId -> Value
toJSON :: MediaGroupId -> Value
$ctoEncoding :: MediaGroupId -> Encoding
toEncoding :: MediaGroupId -> Encoding
$ctoJSONList :: [MediaGroupId] -> Value
toJSONList :: [MediaGroupId] -> Value
$ctoEncodingList :: [MediaGroupId] -> Encoding
toEncodingList :: [MediaGroupId] -> Encoding
$comitField :: MediaGroupId -> Bool
omitField :: MediaGroupId -> Bool
ToJSON, Maybe MediaGroupId
Value -> Parser [MediaGroupId]
Value -> Parser MediaGroupId
(Value -> Parser MediaGroupId)
-> (Value -> Parser [MediaGroupId])
-> Maybe MediaGroupId
-> FromJSON MediaGroupId
forall a.
(Value -> Parser a)
-> (Value -> Parser [a]) -> Maybe a -> FromJSON a
$cparseJSON :: Value -> Parser MediaGroupId
parseJSON :: Value -> Parser MediaGroupId
$cparseJSONList :: Value -> Parser [MediaGroupId]
parseJSONList :: Value -> Parser [MediaGroupId]
$comittedField :: Maybe MediaGroupId
omittedField :: Maybe MediaGroupId
FromJSON)
newtype RequestId = RequestId Integer
  deriving (RequestId -> RequestId -> Bool
(RequestId -> RequestId -> Bool)
-> (RequestId -> RequestId -> Bool) -> Eq RequestId
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: RequestId -> RequestId -> Bool
== :: RequestId -> RequestId -> Bool
$c/= :: RequestId -> RequestId -> Bool
/= :: RequestId -> RequestId -> Bool
Eq, Int -> RequestId -> ShowS
[RequestId] -> ShowS
RequestId -> String
(Int -> RequestId -> ShowS)
-> (RequestId -> String)
-> ([RequestId] -> ShowS)
-> Show RequestId
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> RequestId -> ShowS
showsPrec :: Int -> RequestId -> ShowS
$cshow :: RequestId -> String
show :: RequestId -> String
$cshowList :: [RequestId] -> ShowS
showList :: [RequestId] -> ShowS
Show, [RequestId] -> Value
[RequestId] -> Encoding
RequestId -> Bool
RequestId -> Value
RequestId -> Encoding
(RequestId -> Value)
-> (RequestId -> Encoding)
-> ([RequestId] -> Value)
-> ([RequestId] -> Encoding)
-> (RequestId -> Bool)
-> ToJSON RequestId
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> (a -> Bool)
-> ToJSON a
$ctoJSON :: RequestId -> Value
toJSON :: RequestId -> Value
$ctoEncoding :: RequestId -> Encoding
toEncoding :: RequestId -> Encoding
$ctoJSONList :: [RequestId] -> Value
toJSONList :: [RequestId] -> Value
$ctoEncodingList :: [RequestId] -> Encoding
toEncodingList :: [RequestId] -> Encoding
$comitField :: RequestId -> Bool
omitField :: RequestId -> Bool
ToJSON, Maybe RequestId
Value -> Parser [RequestId]
Value -> Parser RequestId
(Value -> Parser RequestId)
-> (Value -> Parser [RequestId])
-> Maybe RequestId
-> FromJSON RequestId
forall a.
(Value -> Parser a)
-> (Value -> Parser [a]) -> Maybe a -> FromJSON a
$cparseJSON :: Value -> Parser RequestId
parseJSON :: Value -> Parser RequestId
$cparseJSONList :: Value -> Parser [RequestId]
parseJSONList :: Value -> Parser [RequestId]
$comittedField :: Maybe RequestId
omittedField :: Maybe RequestId
FromJSON)
newtype PollId = PollId Text
  deriving (PollId -> PollId -> Bool
(PollId -> PollId -> Bool)
-> (PollId -> PollId -> Bool) -> Eq PollId
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: PollId -> PollId -> Bool
== :: PollId -> PollId -> Bool
$c/= :: PollId -> PollId -> Bool
/= :: PollId -> PollId -> Bool
Eq, Int -> PollId -> ShowS
[PollId] -> ShowS
PollId -> String
(Int -> PollId -> ShowS)
-> (PollId -> String) -> ([PollId] -> ShowS) -> Show PollId
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> PollId -> ShowS
showsPrec :: Int -> PollId -> ShowS
$cshow :: PollId -> String
show :: PollId -> String
$cshowList :: [PollId] -> ShowS
showList :: [PollId] -> ShowS
Show, [PollId] -> Value
[PollId] -> Encoding
PollId -> Bool
PollId -> Value
PollId -> Encoding
(PollId -> Value)
-> (PollId -> Encoding)
-> ([PollId] -> Value)
-> ([PollId] -> Encoding)
-> (PollId -> Bool)
-> ToJSON PollId
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> (a -> Bool)
-> ToJSON a
$ctoJSON :: PollId -> Value
toJSON :: PollId -> Value
$ctoEncoding :: PollId -> Encoding
toEncoding :: PollId -> Encoding
$ctoJSONList :: [PollId] -> Value
toJSONList :: [PollId] -> Value
$ctoEncodingList :: [PollId] -> Encoding
toEncodingList :: [PollId] -> Encoding
$comitField :: PollId -> Bool
omitField :: PollId -> Bool
ToJSON, Maybe PollId
Value -> Parser [PollId]
Value -> Parser PollId
(Value -> Parser PollId)
-> (Value -> Parser [PollId]) -> Maybe PollId -> FromJSON PollId
forall a.
(Value -> Parser a)
-> (Value -> Parser [a]) -> Maybe a -> FromJSON a
$cparseJSON :: Value -> Parser PollId
parseJSON :: Value -> Parser PollId
$cparseJSONList :: Value -> Parser [PollId]
parseJSONList :: Value -> Parser [PollId]
$comittedField :: Maybe PollId
omittedField :: Maybe PollId
FromJSON)
newtype ShippingOptionId = ShippingOptionId Text
  deriving (ShippingOptionId -> ShippingOptionId -> Bool
(ShippingOptionId -> ShippingOptionId -> Bool)
-> (ShippingOptionId -> ShippingOptionId -> Bool)
-> Eq ShippingOptionId
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ShippingOptionId -> ShippingOptionId -> Bool
== :: ShippingOptionId -> ShippingOptionId -> Bool
$c/= :: ShippingOptionId -> ShippingOptionId -> Bool
/= :: ShippingOptionId -> ShippingOptionId -> Bool
Eq, Int -> ShippingOptionId -> ShowS
[ShippingOptionId] -> ShowS
ShippingOptionId -> String
(Int -> ShippingOptionId -> ShowS)
-> (ShippingOptionId -> String)
-> ([ShippingOptionId] -> ShowS)
-> Show ShippingOptionId
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ShippingOptionId -> ShowS
showsPrec :: Int -> ShippingOptionId -> ShowS
$cshow :: ShippingOptionId -> String
show :: ShippingOptionId -> String
$cshowList :: [ShippingOptionId] -> ShowS
showList :: [ShippingOptionId] -> ShowS
Show, (forall x. ShippingOptionId -> Rep ShippingOptionId x)
-> (forall x. Rep ShippingOptionId x -> ShippingOptionId)
-> Generic ShippingOptionId
forall x. Rep ShippingOptionId x -> ShippingOptionId
forall x. ShippingOptionId -> Rep ShippingOptionId x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. ShippingOptionId -> Rep ShippingOptionId x
from :: forall x. ShippingOptionId -> Rep ShippingOptionId x
$cto :: forall x. Rep ShippingOptionId x -> ShippingOptionId
to :: forall x. Rep ShippingOptionId x -> ShippingOptionId
Generic, [ShippingOptionId] -> Value
[ShippingOptionId] -> Encoding
ShippingOptionId -> Bool
ShippingOptionId -> Value
ShippingOptionId -> Encoding
(ShippingOptionId -> Value)
-> (ShippingOptionId -> Encoding)
-> ([ShippingOptionId] -> Value)
-> ([ShippingOptionId] -> Encoding)
-> (ShippingOptionId -> Bool)
-> ToJSON ShippingOptionId
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> (a -> Bool)
-> ToJSON a
$ctoJSON :: ShippingOptionId -> Value
toJSON :: ShippingOptionId -> Value
$ctoEncoding :: ShippingOptionId -> Encoding
toEncoding :: ShippingOptionId -> Encoding
$ctoJSONList :: [ShippingOptionId] -> Value
toJSONList :: [ShippingOptionId] -> Value
$ctoEncodingList :: [ShippingOptionId] -> Encoding
toEncodingList :: [ShippingOptionId] -> Encoding
$comitField :: ShippingOptionId -> Bool
omitField :: ShippingOptionId -> Bool
ToJSON, Maybe ShippingOptionId
Value -> Parser [ShippingOptionId]
Value -> Parser ShippingOptionId
(Value -> Parser ShippingOptionId)
-> (Value -> Parser [ShippingOptionId])
-> Maybe ShippingOptionId
-> FromJSON ShippingOptionId
forall a.
(Value -> Parser a)
-> (Value -> Parser [a]) -> Maybe a -> FromJSON a
$cparseJSON :: Value -> Parser ShippingOptionId
parseJSON :: Value -> Parser ShippingOptionId
$cparseJSONList :: Value -> Parser [ShippingOptionId]
parseJSONList :: Value -> Parser [ShippingOptionId]
$comittedField :: Maybe ShippingOptionId
omittedField :: Maybe ShippingOptionId
FromJSON)
newtype WebAppInfo = WebAppInfo { WebAppInfo -> Text
webAppInfoUrl :: Text }
  deriving ((forall x. WebAppInfo -> Rep WebAppInfo x)
-> (forall x. Rep WebAppInfo x -> WebAppInfo) -> Generic WebAppInfo
forall x. Rep WebAppInfo x -> WebAppInfo
forall x. WebAppInfo -> Rep WebAppInfo x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. WebAppInfo -> Rep WebAppInfo x
from :: forall x. WebAppInfo -> Rep WebAppInfo x
$cto :: forall x. Rep WebAppInfo x -> WebAppInfo
to :: forall x. Rep WebAppInfo x -> WebAppInfo
Generic, Int -> WebAppInfo -> ShowS
[WebAppInfo] -> ShowS
WebAppInfo -> String
(Int -> WebAppInfo -> ShowS)
-> (WebAppInfo -> String)
-> ([WebAppInfo] -> ShowS)
-> Show WebAppInfo
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> WebAppInfo -> ShowS
showsPrec :: Int -> WebAppInfo -> ShowS
$cshow :: WebAppInfo -> String
show :: WebAppInfo -> String
$cshowList :: [WebAppInfo] -> ShowS
showList :: [WebAppInfo] -> ShowS
Show, [WebAppInfo] -> Value
[WebAppInfo] -> Encoding
WebAppInfo -> Bool
WebAppInfo -> Value
WebAppInfo -> Encoding
(WebAppInfo -> Value)
-> (WebAppInfo -> Encoding)
-> ([WebAppInfo] -> Value)
-> ([WebAppInfo] -> Encoding)
-> (WebAppInfo -> Bool)
-> ToJSON WebAppInfo
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> (a -> Bool)
-> ToJSON a
$ctoJSON :: WebAppInfo -> Value
toJSON :: WebAppInfo -> Value
$ctoEncoding :: WebAppInfo -> Encoding
toEncoding :: WebAppInfo -> Encoding
$ctoJSONList :: [WebAppInfo] -> Value
toJSONList :: [WebAppInfo] -> Value
$ctoEncodingList :: [WebAppInfo] -> Encoding
toEncodingList :: [WebAppInfo] -> Encoding
$comitField :: WebAppInfo -> Bool
omitField :: WebAppInfo -> Bool
ToJSON, Maybe WebAppInfo
Value -> Parser [WebAppInfo]
Value -> Parser WebAppInfo
(Value -> Parser WebAppInfo)
-> (Value -> Parser [WebAppInfo])
-> Maybe WebAppInfo
-> FromJSON WebAppInfo
forall a.
(Value -> Parser a)
-> (Value -> Parser [a]) -> Maybe a -> FromJSON a
$cparseJSON :: Value -> Parser WebAppInfo
parseJSON :: Value -> Parser WebAppInfo
$cparseJSONList :: Value -> Parser [WebAppInfo]
parseJSONList :: Value -> Parser [WebAppInfo]
$comittedField :: Maybe WebAppInfo
omittedField :: Maybe WebAppInfo
FromJSON)
newtype CallbackQueryId = CallbackQueryId Text
  deriving (CallbackQueryId -> CallbackQueryId -> Bool
(CallbackQueryId -> CallbackQueryId -> Bool)
-> (CallbackQueryId -> CallbackQueryId -> Bool)
-> Eq CallbackQueryId
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: CallbackQueryId -> CallbackQueryId -> Bool
== :: CallbackQueryId -> CallbackQueryId -> Bool
$c/= :: CallbackQueryId -> CallbackQueryId -> Bool
/= :: CallbackQueryId -> CallbackQueryId -> Bool
Eq, Int -> CallbackQueryId -> ShowS
[CallbackQueryId] -> ShowS
CallbackQueryId -> String
(Int -> CallbackQueryId -> ShowS)
-> (CallbackQueryId -> String)
-> ([CallbackQueryId] -> ShowS)
-> Show CallbackQueryId
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> CallbackQueryId -> ShowS
showsPrec :: Int -> CallbackQueryId -> ShowS
$cshow :: CallbackQueryId -> String
show :: CallbackQueryId -> String
$cshowList :: [CallbackQueryId] -> ShowS
showList :: [CallbackQueryId] -> ShowS
Show, (forall x. CallbackQueryId -> Rep CallbackQueryId x)
-> (forall x. Rep CallbackQueryId x -> CallbackQueryId)
-> Generic CallbackQueryId
forall x. Rep CallbackQueryId x -> CallbackQueryId
forall x. CallbackQueryId -> Rep CallbackQueryId x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. CallbackQueryId -> Rep CallbackQueryId x
from :: forall x. CallbackQueryId -> Rep CallbackQueryId x
$cto :: forall x. Rep CallbackQueryId x -> CallbackQueryId
to :: forall x. Rep CallbackQueryId x -> CallbackQueryId
Generic, [CallbackQueryId] -> Value
[CallbackQueryId] -> Encoding
CallbackQueryId -> Bool
CallbackQueryId -> Value
CallbackQueryId -> Encoding
(CallbackQueryId -> Value)
-> (CallbackQueryId -> Encoding)
-> ([CallbackQueryId] -> Value)
-> ([CallbackQueryId] -> Encoding)
-> (CallbackQueryId -> Bool)
-> ToJSON CallbackQueryId
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> (a -> Bool)
-> ToJSON a
$ctoJSON :: CallbackQueryId -> Value
toJSON :: CallbackQueryId -> Value
$ctoEncoding :: CallbackQueryId -> Encoding
toEncoding :: CallbackQueryId -> Encoding
$ctoJSONList :: [CallbackQueryId] -> Value
toJSONList :: [CallbackQueryId] -> Value
$ctoEncodingList :: [CallbackQueryId] -> Encoding
toEncodingList :: [CallbackQueryId] -> Encoding
$comitField :: CallbackQueryId -> Bool
omitField :: CallbackQueryId -> Bool
ToJSON, Maybe CallbackQueryId
Value -> Parser [CallbackQueryId]
Value -> Parser CallbackQueryId
(Value -> Parser CallbackQueryId)
-> (Value -> Parser [CallbackQueryId])
-> Maybe CallbackQueryId
-> FromJSON CallbackQueryId
forall a.
(Value -> Parser a)
-> (Value -> Parser [a]) -> Maybe a -> FromJSON a
$cparseJSON :: Value -> Parser CallbackQueryId
parseJSON :: Value -> Parser CallbackQueryId
$cparseJSONList :: Value -> Parser [CallbackQueryId]
parseJSONList :: Value -> Parser [CallbackQueryId]
$comittedField :: Maybe CallbackQueryId
omittedField :: Maybe CallbackQueryId
FromJSON)
newtype BusinessConnectionId = BusinessConnectionId Text
  deriving (BusinessConnectionId -> BusinessConnectionId -> Bool
(BusinessConnectionId -> BusinessConnectionId -> Bool)
-> (BusinessConnectionId -> BusinessConnectionId -> Bool)
-> Eq BusinessConnectionId
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: BusinessConnectionId -> BusinessConnectionId -> Bool
== :: BusinessConnectionId -> BusinessConnectionId -> Bool
$c/= :: BusinessConnectionId -> BusinessConnectionId -> Bool
/= :: BusinessConnectionId -> BusinessConnectionId -> Bool
Eq, Int -> BusinessConnectionId -> ShowS
[BusinessConnectionId] -> ShowS
BusinessConnectionId -> String
(Int -> BusinessConnectionId -> ShowS)
-> (BusinessConnectionId -> String)
-> ([BusinessConnectionId] -> ShowS)
-> Show BusinessConnectionId
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> BusinessConnectionId -> ShowS
showsPrec :: Int -> BusinessConnectionId -> ShowS
$cshow :: BusinessConnectionId -> String
show :: BusinessConnectionId -> String
$cshowList :: [BusinessConnectionId] -> ShowS
showList :: [BusinessConnectionId] -> ShowS
Show, (forall x. BusinessConnectionId -> Rep BusinessConnectionId x)
-> (forall x. Rep BusinessConnectionId x -> BusinessConnectionId)
-> Generic BusinessConnectionId
forall x. Rep BusinessConnectionId x -> BusinessConnectionId
forall x. BusinessConnectionId -> Rep BusinessConnectionId x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. BusinessConnectionId -> Rep BusinessConnectionId x
from :: forall x. BusinessConnectionId -> Rep BusinessConnectionId x
$cto :: forall x. Rep BusinessConnectionId x -> BusinessConnectionId
to :: forall x. Rep BusinessConnectionId x -> BusinessConnectionId
Generic, BusinessConnectionId -> Text
BusinessConnectionId -> ByteString
BusinessConnectionId -> Builder
(BusinessConnectionId -> Text)
-> (BusinessConnectionId -> Builder)
-> (BusinessConnectionId -> ByteString)
-> (BusinessConnectionId -> Text)
-> (BusinessConnectionId -> Builder)
-> ToHttpApiData BusinessConnectionId
forall a.
(a -> Text)
-> (a -> Builder)
-> (a -> ByteString)
-> (a -> Text)
-> (a -> Builder)
-> ToHttpApiData a
$ctoUrlPiece :: BusinessConnectionId -> Text
toUrlPiece :: BusinessConnectionId -> Text
$ctoEncodedUrlPiece :: BusinessConnectionId -> Builder
toEncodedUrlPiece :: BusinessConnectionId -> Builder
$ctoHeader :: BusinessConnectionId -> ByteString
toHeader :: BusinessConnectionId -> ByteString
$ctoQueryParam :: BusinessConnectionId -> Text
toQueryParam :: BusinessConnectionId -> Text
$ctoEncodedQueryParam :: BusinessConnectionId -> Builder
toEncodedQueryParam :: BusinessConnectionId -> Builder
ToHttpApiData, [BusinessConnectionId] -> Value
[BusinessConnectionId] -> Encoding
BusinessConnectionId -> Bool
BusinessConnectionId -> Value
BusinessConnectionId -> Encoding
(BusinessConnectionId -> Value)
-> (BusinessConnectionId -> Encoding)
-> ([BusinessConnectionId] -> Value)
-> ([BusinessConnectionId] -> Encoding)
-> (BusinessConnectionId -> Bool)
-> ToJSON BusinessConnectionId
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> (a -> Bool)
-> ToJSON a
$ctoJSON :: BusinessConnectionId -> Value
toJSON :: BusinessConnectionId -> Value
$ctoEncoding :: BusinessConnectionId -> Encoding
toEncoding :: BusinessConnectionId -> Encoding
$ctoJSONList :: [BusinessConnectionId] -> Value
toJSONList :: [BusinessConnectionId] -> Value
$ctoEncodingList :: [BusinessConnectionId] -> Encoding
toEncodingList :: [BusinessConnectionId] -> Encoding
$comitField :: BusinessConnectionId -> Bool
omitField :: BusinessConnectionId -> Bool
ToJSON, Maybe BusinessConnectionId
Value -> Parser [BusinessConnectionId]
Value -> Parser BusinessConnectionId
(Value -> Parser BusinessConnectionId)
-> (Value -> Parser [BusinessConnectionId])
-> Maybe BusinessConnectionId
-> FromJSON BusinessConnectionId
forall a.
(Value -> Parser a)
-> (Value -> Parser [a]) -> Maybe a -> FromJSON a
$cparseJSON :: Value -> Parser BusinessConnectionId
parseJSON :: Value -> Parser BusinessConnectionId
$cparseJSONList :: Value -> Parser [BusinessConnectionId]
parseJSONList :: Value -> Parser [BusinessConnectionId]
$comittedField :: Maybe BusinessConnectionId
omittedField :: Maybe BusinessConnectionId
FromJSON)
data SomeChatId
  = SomeChatId ChatId       
  | SomeChatUsername Text   
  deriving ((forall x. SomeChatId -> Rep SomeChatId x)
-> (forall x. Rep SomeChatId x -> SomeChatId) -> Generic SomeChatId
forall x. Rep SomeChatId x -> SomeChatId
forall x. SomeChatId -> Rep SomeChatId x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. SomeChatId -> Rep SomeChatId x
from :: forall x. SomeChatId -> Rep SomeChatId x
$cto :: forall x. Rep SomeChatId x -> SomeChatId
to :: forall x. Rep SomeChatId x -> SomeChatId
Generic, Int -> SomeChatId -> ShowS
[SomeChatId] -> ShowS
SomeChatId -> String
(Int -> SomeChatId -> ShowS)
-> (SomeChatId -> String)
-> ([SomeChatId] -> ShowS)
-> Show SomeChatId
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SomeChatId -> ShowS
showsPrec :: Int -> SomeChatId -> ShowS
$cshow :: SomeChatId -> String
show :: SomeChatId -> String
$cshowList :: [SomeChatId] -> ShowS
showList :: [SomeChatId] -> ShowS
Show)
instance ToJSON   SomeChatId where toJSON :: SomeChatId -> Value
toJSON = SomeChatId -> Value
forall a. (Generic a, GSomeJSON (Rep a)) => a -> Value
genericSomeToJSON
instance FromJSON SomeChatId where parseJSON :: Value -> Parser SomeChatId
parseJSON = Value -> Parser SomeChatId
forall a. (Generic a, GSomeJSON (Rep a)) => Value -> Parser a
genericSomeParseJSON
instance ToHttpApiData SomeChatId where
  toUrlPiece :: SomeChatId -> Text
toUrlPiece (SomeChatId ChatId
chatid) = ChatId -> Text
forall a. ToHttpApiData a => a -> Text
toUrlPiece ChatId
chatid
  toUrlPiece (SomeChatUsername Text
name) = Text
name
addType :: Text -> [Pair] -> [Pair]
addType :: Text -> [Pair] -> [Pair]
addType Text
name [Pair]
xs = (Key
"type" Key -> Text -> Pair
forall v. ToJSON v => Key -> v -> Pair
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
.= Text
name) Pair -> [Pair] -> [Pair]
forall a. a -> [a] -> [a]
: [Pair]
xs