{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TemplateHaskell #-}
{-# LANGUAGE TypeApplications #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE BlockArguments #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE MultiParamTypeClasses #-}
module Telegram.Bot.API.Types
( RequiredQueryParam
, module Telegram.Bot.API.Types.Animation
, module Telegram.Bot.API.Types.Audio
, module Telegram.Bot.API.Types.BotCommand
, module Telegram.Bot.API.Types.BotCommandScope
, module Telegram.Bot.API.Types.CallbackGame
, module Telegram.Bot.API.Types.CallbackQuery
, module Telegram.Bot.API.Types.Chat
, module Telegram.Bot.API.Types.ChatAdministratorRights
, module Telegram.Bot.API.Types.ChatInviteLink
, module Telegram.Bot.API.Types.ChatJoinRequest
, module Telegram.Bot.API.Types.ChatLocation
, module Telegram.Bot.API.Types.ChatMember
, module Telegram.Bot.API.Types.ChatMemberUpdated
, module Telegram.Bot.API.Types.ChatPermissions
, module Telegram.Bot.API.Types.ChatPhoto
, module Telegram.Bot.API.Types.ChatShared
, module Telegram.Bot.API.Types.Common
, module Telegram.Bot.API.Types.Contact
, module Telegram.Bot.API.Types.CopyMessageId
, module Telegram.Bot.API.Types.Dice
, module Telegram.Bot.API.Types.Document
, module Telegram.Bot.API.Types.EncryptedCredentials
, module Telegram.Bot.API.Types.EncryptedPassportElement
, module Telegram.Bot.API.Types.File
, module Telegram.Bot.API.Types.ForceReply
, module Telegram.Bot.API.Types.ForumTopic
, module Telegram.Bot.API.Types.ForumTopicEdited
, module Telegram.Bot.API.Types.ForumTopicClosed
, module Telegram.Bot.API.Types.ForumTopicCreated
, module Telegram.Bot.API.Types.ForumTopicReopened
, module Telegram.Bot.API.Types.Game
, module Telegram.Bot.API.Types.GameHighScore
, module Telegram.Bot.API.Types.GeneralForumTopicHidden
, module Telegram.Bot.API.Types.GeneralForumTopicUnhidden
, module Telegram.Bot.API.Types.InlineKeyboardButton
, module Telegram.Bot.API.Types.InlineKeyboardMarkup
, module Telegram.Bot.API.Types.InputMedia
, module Telegram.Bot.API.Types.Invoice
, module Telegram.Bot.API.Types.KeyboardButton
, module Telegram.Bot.API.Types.KeyboardButtonRequestChat
, module Telegram.Bot.API.Types.KeyboardButtonRequestUser
, module Telegram.Bot.API.Types.LabeledPrice
, module Telegram.Bot.API.Types.Location
, module Telegram.Bot.API.Types.LoginUrl
, module Telegram.Bot.API.Types.MaskPosition
, module Telegram.Bot.API.Types.MenuButton
, module Telegram.Bot.API.Types.Message
, module Telegram.Bot.API.Types.MessageAutoDeleteTimerChanged
, module Telegram.Bot.API.Types.MessageEntity
, module Telegram.Bot.API.Types.OrderInfo
, module Telegram.Bot.API.Types.PassportData
, module Telegram.Bot.API.Types.PassportElementError
, module Telegram.Bot.API.Types.PassportFile
, module Telegram.Bot.API.Types.PhotoSize
, module Telegram.Bot.API.Types.Poll
, module Telegram.Bot.API.Types.PollAnswer
, module Telegram.Bot.API.Types.PollOption
, module Telegram.Bot.API.Types.PollType
, module Telegram.Bot.API.Types.PreCheckoutQuery
, module Telegram.Bot.API.Types.ProximityAlertTriggered
, module Telegram.Bot.API.Types.ReplyKeyboardMarkup
, module Telegram.Bot.API.Types.ReplyKeyboardRemove
, module Telegram.Bot.API.Types.ResponseParameters
, module Telegram.Bot.API.Types.ShippingAddress
, module Telegram.Bot.API.Types.ShippingOption
, module Telegram.Bot.API.Types.ShippingQuery
, module Telegram.Bot.API.Types.Sticker
, module Telegram.Bot.API.Types.SuccessfulPayment
, module Telegram.Bot.API.Types.User
, module Telegram.Bot.API.Types.UserProfilePhotos
, module Telegram.Bot.API.Types.UserShared
, module Telegram.Bot.API.Types.Venue
, module Telegram.Bot.API.Types.Video
, module Telegram.Bot.API.Types.VideoChatEnded
, module Telegram.Bot.API.Types.VideoChatScheduled
, module Telegram.Bot.API.Types.VideoChatStarted
, module Telegram.Bot.API.Types.VideoNote
, module Telegram.Bot.API.Types.Voice
, module Telegram.Bot.API.Types.WebAppData
, module Telegram.Bot.API.Types.WriteAccessAllowed
) where
import Servant.API
import Telegram.Bot.API.Types.Animation
import Telegram.Bot.API.Types.Audio
import Telegram.Bot.API.Types.BotCommand
import Telegram.Bot.API.Types.BotCommandScope
import Telegram.Bot.API.Types.CallbackGame
import Telegram.Bot.API.Types.CallbackQuery
import Telegram.Bot.API.Types.Chat
import Telegram.Bot.API.Types.ChatAdministratorRights
import Telegram.Bot.API.Types.ChatInviteLink
import Telegram.Bot.API.Types.ChatJoinRequest
import Telegram.Bot.API.Types.ChatLocation
import Telegram.Bot.API.Types.ChatMember
import Telegram.Bot.API.Types.ChatMemberUpdated
import Telegram.Bot.API.Types.ChatPermissions
import Telegram.Bot.API.Types.ChatPhoto
import Telegram.Bot.API.Types.ChatShared
import Telegram.Bot.API.Types.Common
import Telegram.Bot.API.Types.Contact
import Telegram.Bot.API.Types.CopyMessageId
import Telegram.Bot.API.Types.Dice
import Telegram.Bot.API.Types.Document
import Telegram.Bot.API.Types.EncryptedCredentials
import Telegram.Bot.API.Types.EncryptedPassportElement
import Telegram.Bot.API.Types.File
import Telegram.Bot.API.Types.ForceReply
import Telegram.Bot.API.Types.ForumTopic
import Telegram.Bot.API.Types.ForumTopicEdited
import Telegram.Bot.API.Types.ForumTopicClosed
import Telegram.Bot.API.Types.ForumTopicCreated
import Telegram.Bot.API.Types.ForumTopicReopened
import Telegram.Bot.API.Types.Game
import Telegram.Bot.API.Types.GameHighScore
import Telegram.Bot.API.Types.GeneralForumTopicHidden
import Telegram.Bot.API.Types.GeneralForumTopicUnhidden
import Telegram.Bot.API.Types.InlineKeyboardButton
import Telegram.Bot.API.Types.InlineKeyboardMarkup
import Telegram.Bot.API.Types.InputMedia
import Telegram.Bot.API.Types.Invoice
import Telegram.Bot.API.Types.KeyboardButton
import Telegram.Bot.API.Types.KeyboardButtonRequestChat
import Telegram.Bot.API.Types.KeyboardButtonRequestUser
import Telegram.Bot.API.Types.LabeledPrice
import Telegram.Bot.API.Types.Location
import Telegram.Bot.API.Types.LoginUrl
import Telegram.Bot.API.Types.MaskPosition
import Telegram.Bot.API.Types.MenuButton
import Telegram.Bot.API.Types.Message
import Telegram.Bot.API.Types.MessageAutoDeleteTimerChanged
import Telegram.Bot.API.Types.MessageEntity
import Telegram.Bot.API.Types.OrderInfo
import Telegram.Bot.API.Types.PassportData
import Telegram.Bot.API.Types.PassportElementError
import Telegram.Bot.API.Types.PassportFile
import Telegram.Bot.API.Types.PhotoSize
import Telegram.Bot.API.Types.Poll
import Telegram.Bot.API.Types.PollAnswer
import Telegram.Bot.API.Types.PollOption
import Telegram.Bot.API.Types.PollType
import Telegram.Bot.API.Types.PreCheckoutQuery
import Telegram.Bot.API.Types.ProximityAlertTriggered
import Telegram.Bot.API.Types.ReplyKeyboardMarkup
import Telegram.Bot.API.Types.ReplyKeyboardRemove
import Telegram.Bot.API.Types.ResponseParameters
import Telegram.Bot.API.Types.ShippingAddress
import Telegram.Bot.API.Types.ShippingOption
import Telegram.Bot.API.Types.ShippingQuery
import Telegram.Bot.API.Types.Sticker
import Telegram.Bot.API.Types.SuccessfulPayment
import Telegram.Bot.API.Types.User
import Telegram.Bot.API.Types.UserProfilePhotos
import Telegram.Bot.API.Types.UserShared
import Telegram.Bot.API.Types.Venue
import Telegram.Bot.API.Types.Video
import Telegram.Bot.API.Types.VideoChatEnded
import Telegram.Bot.API.Types.VideoChatScheduled
import Telegram.Bot.API.Types.VideoChatStarted
import Telegram.Bot.API.Types.VideoNote
import Telegram.Bot.API.Types.Voice
import Telegram.Bot.API.Types.WebAppData
import Telegram.Bot.API.Types.WriteAccessAllowed
type RequiredQueryParam = QueryParam' '[Required , Strict]