telegram-api-0.7.1.0: Telegram Bot API bindings

Safe HaskellNone
LanguageHaskell2010

Web.Telegram.API.Bot.Responses

Contents

Description

This module contains responses from Telegram Bot API

Synopsis

Types

data Response a Source #

Constructors

Response 

Instances

Show a => Show (Response a) Source # 

Methods

showsPrec :: Int -> Response a -> ShowS #

show :: Response a -> String #

showList :: [Response a] -> ShowS #

Generic (Response a) Source # 

Associated Types

type Rep (Response a) :: * -> * #

Methods

from :: Response a -> Rep (Response a) x #

to :: Rep (Response a) x -> Response a #

FromJSON a => FromJSON (Response a) Source # 
type Rep (Response a) Source # 
type Rep (Response a) = D1 (MetaData "Response" "Web.Telegram.API.Bot.Responses" "telegram-api-0.7.1.0-G1ptBQdtycLDXvbHTxbPHG" False) (C1 (MetaCons "Response" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "result") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)) (S1 (MetaSel (Just Symbol "parameters") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe ResponseParameters)))))

data ResponseParameters Source #

Constructors

ResponseParameters 

Fields

  • res_migrate_to_chat_id :: Maybe Int64

    The group has been migrated to a supergroup with the specified identifier. This number may be greater than 32 bits and some programming languages may have difficulty/silent defects in interpreting it. But it is smaller than 52 bits, so a signed 64 bit integer or double-precision float type are safe for storing this identifier.

  • res_retry_after :: Maybe Int

    In case of exceeding flood control, the number of seconds left to wait before the request can be repeated

type GetMeResponse = Response User Source #

This object represents getMe response

type MessageResponse = Response Message Source #

This object represents message response

type ChatActionResponse = Response Bool Source #

This object represents sendChatAction response

type UpdatesResponse = Response [Update] Source #

This object represents getUpdates response

type FileResponse = Response File Source #

This object represents file response

type UserProfilePhotosResponse = Response UserProfilePhotos Source #

This object represents user profile photos response

type SetWebhookResponse = Response Bool Source #

This object represents setWebhook response

type InlineQueryResponse = Response Bool Source #

This object represents answerInlineQuery response

type CallbackQueryResponse = Response Bool Source #

This object represents answerCallbackQuery response

type KickChatMemberResponse = Response Bool Source #

This object represents kickChatMember response

type UnbanChatMemberResponse = Response Bool Source #

This object represents unbanChatMember response