telegram-raw-api-0.3.0: Servant bindings to the Telegram bot API

Safe HaskellNone
LanguageHaskell2010

Web.Telegram.API.Actions

Description

Actions that the bot can perform

Documentation

type KickChatMember = Base :> ("kickChatmember" :> (ReqBody '[JSON] Kick :> Get '[JSON] (ReqResult Bool))) Source #

data Kick Source #

Instances
Eq Kick Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Methods

(==) :: Kick -> Kick -> Bool #

(/=) :: Kick -> Kick -> Bool #

Show Kick Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Methods

showsPrec :: Int -> Kick -> ShowS #

show :: Kick -> String #

showList :: [Kick] -> ShowS #

Generic Kick Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Associated Types

type Rep Kick :: Type -> Type #

Methods

from :: Kick -> Rep Kick x #

to :: Rep Kick x -> Kick #

ToJSON Kick Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Default Kick Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Methods

def :: Kick #

type Rep Kick Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

type Rep Kick = D1 (MetaData "Kick" "Web.Telegram.API.Actions.Data" "telegram-raw-api-0.3.0-CeC2zg6UYPuLfYfz1lUNhE" False) (C1 (MetaCons "Kick" PrefixI True) (S1 (MetaSel (Just "chatId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ChatId) :*: (S1 (MetaSel (Just "userId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int) :*: S1 (MetaSel (Just "untilDate") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe POSIXTime)))))

type UnbanChatMember = Base :> ("unbanChatMember" :> (ReqBody '[JSON] Unban :> Get '[JSON] (ReqResult Bool))) Source #

data Unban Source #

Instances
Eq Unban Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Methods

(==) :: Unban -> Unban -> Bool #

(/=) :: Unban -> Unban -> Bool #

Show Unban Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Methods

showsPrec :: Int -> Unban -> ShowS #

show :: Unban -> String #

showList :: [Unban] -> ShowS #

Generic Unban Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Associated Types

type Rep Unban :: Type -> Type #

Methods

from :: Unban -> Rep Unban x #

to :: Rep Unban x -> Unban #

ToJSON Unban Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Default Unban Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Methods

def :: Unban #

type Rep Unban Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

type Rep Unban = D1 (MetaData "Unban" "Web.Telegram.API.Actions.Data" "telegram-raw-api-0.3.0-CeC2zg6UYPuLfYfz1lUNhE" False) (C1 (MetaCons "Unban" PrefixI True) (S1 (MetaSel (Just "chatId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ChatId) :*: S1 (MetaSel (Just "userId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)))

type RestrictChatMember = Base :> ("restrictChatMember" :> (ReqBody '[JSON] Restriction :> Get '[JSON] (ReqResult Bool))) Source #

data Restriction Source #

Instances
Eq Restriction Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Show Restriction Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Generic Restriction Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Associated Types

type Rep Restriction :: Type -> Type #

ToJSON Restriction Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Default Restriction Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Methods

def :: Restriction #

type Rep Restriction Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

type Rep Restriction = D1 (MetaData "Restriction" "Web.Telegram.API.Actions.Data" "telegram-raw-api-0.3.0-CeC2zg6UYPuLfYfz1lUNhE" False) (C1 (MetaCons "Restriction" PrefixI True) ((S1 (MetaSel (Just "chatId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ChatId) :*: S1 (MetaSel (Just "userId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)) :*: (S1 (MetaSel (Just "permissions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ChatPermissions) :*: S1 (MetaSel (Just "untilDate") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe POSIXTime)))))

type PromoteChatMember = Base :> ("promoteChatMember" :> (ReqBody '[JSON] Promotion :> Get '[JSON] (ReqResult Bool))) Source #

data Promotion Source #

Instances
Eq Promotion Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Show Promotion Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Generic Promotion Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Associated Types

type Rep Promotion :: Type -> Type #

ToJSON Promotion Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Default Promotion Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Methods

def :: Promotion #

type Rep Promotion Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

type SetChatAdministratorCustomTitle = Base :> ("setChatAdministratorCustomTitle" :> (QueryR "chat_id" ChatId :> (QueryR "user_id" Int :> (QueryParam "custom_title" Text :> Get '[JSON] (ReqResult Bool))))) Source #

type SetChatPermissions = Base :> ("setChatPermissions" :> (QueryR "chat_id" ChatId :> (QueryR "permissions" ChatPermissions :> Get '[JSON] (ReqResult Bool)))) Source #

type ExportChatInviteLink = Base :> ("exportChatInviteLink" :> (QueryR "chat_id" ChatId :> Get '[JSON] (ReqResult Text))) Source #

type SetChatPhoto = Base :> ("setChatPhoto" :> (QueryR "chat_id" ChatId :> (CompoundParam Mem "photo" InputFile :> Get '[JSON] (ReqResult Bool)))) Source #

type DeleteChatPhoto = Base :> ("deleteChatPhoto" :> (QueryR "chat_id" ChatId :> Get '[JSON] (ReqResult Bool))) Source #

type SetChatTitle = Base :> ("setChatTitle" :> (QueryR "chat_id" ChatId :> (QueryR "title" Text :> Get '[JSON] (ReqResult Bool)))) Source #

type SetChatDescription = Base :> ("setChatDescription" :> (QueryR "chat_id" ChatId :> (QueryParam "description" Text :> Get '[JSON] (ReqResult Bool)))) Source #

type PinChatMessage = Base :> ("pinChatMessage" :> (QueryR "chat_id" ChatId :> (QueryR "message_id" Int :> (QueryParam "disable_notification" Bool :> Get '[JSON] (ReqResult Bool))))) Source #

type UnpinChatMessage = Base :> ("unpinChatMessage" :> (QueryR "chat_id" ChatId :> Get '[JSON] (ReqResult Bool))) Source #

type LeaveChat = Base :> ("leaveChat" :> (QueryR "chat_id" ChatId :> Get '[JSON] (ReqResult Bool))) Source #

type SetChatStickerSet = Base :> ("setChatStickerSet" :> (QueryR "chat_id" ChatId :> (QueryR "sticker_set_name" Text :> Get '[JSON] (ReqResult Bool)))) Source #

type DeleteChatStickerSet = Base :> ("deleteChatStickerSet" :> (QueryR "chat_id" ChatId :> Get '[JSON] (ReqResult Bool))) Source #

type UploadStickerFile = UploadStickerFile' (QueryR "png_sticker" Text) Source #

type CreateNewStickerSet = CreateNewStickerSet' (QueryR "png_sticker" Text) Source #

type AddStickerToSet = AddStickerToSet' (QueryR "png_sticker" Text) Source #

type SetStickerPositionInSet = Base :> ("setStickerPositionInSet" :> (QueryR "sticker" Text :> (QueryR "positon" Int :> Get '[JSON] (ReqResult Bool)))) Source #

type DeleteStickerFromSet = Base :> ("deleteStickerFromSet" :> (QueryR "sticker" Text :> Get '[JSON] (ReqResult Bool))) Source #

type SetStickerSetThumb = SetStickerSetThumb' (QueryR "thumb" Text) Source #

type SetMyCommands = Base :> ("setMyCommands" :> (ReqBody '[JSON] CommandSet :> Get '[JSON] (ReqResult Bool))) Source #

type AnswerInlineQuery = Base :> ("answerInlineQuery" :> (ReqBody '[JSON] InlineQueryAnswer :> Get '[JSON] (ReqResult Bool))) Source #

data InlineQueryAnswer Source #

Instances
Eq InlineQueryAnswer Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Show InlineQueryAnswer Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Generic InlineQueryAnswer Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Associated Types

type Rep InlineQueryAnswer :: Type -> Type #

ToJSON InlineQueryAnswer Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

FromJSON InlineQueryAnswer Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Default InlineQueryAnswer Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

type Rep InlineQueryAnswer Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

type AnswerCallbackQuery = Base :> ("answerCallbackQuery" :> (ReqBody '[JSON] CallbackQueryAnswer :> Get '[JSON] (ReqResult Bool))) Source #

data CallbackQueryAnswer Source #

Instances
Eq CallbackQueryAnswer Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Show CallbackQueryAnswer Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Generic CallbackQueryAnswer Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Associated Types

type Rep CallbackQueryAnswer :: Type -> Type #

ToJSON CallbackQueryAnswer Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

FromJSON CallbackQueryAnswer Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

Default CallbackQueryAnswer Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data

type Rep CallbackQueryAnswer Source # 
Instance details

Defined in Web.Telegram.API.Actions.Data