telega-0.2.3: Telegram Bot API binding

Safe HaskellNone
LanguageHaskell2010

Network.API.Telegram.Bot.Object.Update.Message

Documentation

data Message Source #

Instances
Show Message Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

FromJSON Message Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Methods

parseJSON :: Value -> Parser Message

parseJSONList :: Value -> Parser [Message]

Identifiable Message Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Identificator Message :: * Source #

Accessible Content Message Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Methods

access :: Lens' Message Content Source #

Accessible Origin Message Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Methods

access :: Lens' Message Origin Source #

Persistable (Delete Message) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Delete Message) = (payload :: *) Source #

Persistable (Forward Message) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Forward Message) = (payload :: *) Source #

type Identificator Message Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Delete Message) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Forward Message) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

data Send a Source #

Constructors

Send Int64 a 
Instances
Persistable (Send Text) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Send Text) = (payload :: *) Source #

Persistable (Send Audio) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Send Audio) = (payload :: *) Source #

Persistable (Send Document) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Send Document) = (payload :: *) Source #

Persistable (Send Video) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Send Video) = (payload :: *) Source #

Persistable (Send Voice) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Send Voice) = (payload :: *) Source #

Persistable (Send (Text :&: Keyboard)) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Send (Text :&: Keyboard)) = (payload :: *) Source #

Methods

payload :: Payload (Send (Text :&: Keyboard)) -> Object Source #

endpoint :: Payload (Send (Text :&: Keyboard)) -> String Source #

persist :: FromJSON r => Payload (Send (Text :&: Keyboard)) -> Telegram e r Source #

persist_ :: Payload (Send (Text :&: Keyboard)) -> Telegram e () Source #

Persistable (Send obj) => Persistable (Silently Send obj :: *) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Silently Send obj) = (payload :: *) Source #

Methods

payload :: Payload (Silently Send obj) -> Object Source #

endpoint :: Payload (Silently Send obj) -> String Source #

persist :: FromJSON r => Payload (Silently Send obj) -> Telegram e r Source #

persist_ :: Payload (Silently Send obj) -> Telegram e () Source #

type Payload (Send Text) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Send Audio) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Send Document) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Send Video) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Send Voice) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Send (Text :&: Keyboard)) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Send (Text :&: Keyboard)) = Send (Text :&: Keyboard)
type Payload (Silently Send obj :: *) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Silently Send obj :: *) = Silently Send (Payload (Send obj))

data Reply a Source #

Constructors

Reply Int a 
Instances
Persistable (Send a) => Persistable (Reply a :: *) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Reply a) = (payload :: *) Source #

Methods

payload :: Payload (Reply a) -> Object Source #

endpoint :: Payload (Reply a) -> String Source #

persist :: FromJSON r => Payload (Reply a) -> Telegram e r Source #

persist_ :: Payload (Reply a) -> Telegram e () Source #

Persistable (Reply obj) => Persistable (Silently Reply obj :: *) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Silently Reply obj) = (payload :: *) Source #

Methods

payload :: Payload (Silently Reply obj) -> Object Source #

endpoint :: Payload (Silently Reply obj) -> String Source #

persist :: FromJSON r => Payload (Silently Reply obj) -> Telegram e r Source #

persist_ :: Payload (Silently Reply obj) -> Telegram e () Source #

type Payload (Reply a :: *) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Reply a :: *) = Reply (Payload (Send a))
type Payload (Silently Reply obj :: *) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Silently Reply obj :: *) = Silently Reply (Payload (Reply obj))

data Forward a Source #

Constructors

Forward Int Int64 Int64 
Instances
Persistable (Forward obj) => Persistable (Silently (Forward :: * -> *) obj :: *) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Silently Forward obj) = (payload :: *) Source #

Persistable (Forward Message) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Forward Message) = (payload :: *) Source #

type Payload (Silently (Forward :: * -> *) obj :: *) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Silently (Forward :: * -> *) obj :: *) = Silently (Forward :: * -> *) (Payload (Forward obj))
type Payload (Forward Message) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

data Edit b Source #

Constructors

Edit Int64 Int b 
Instances
Persistable (Edit Text) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Edit Text) = (payload :: *) Source #

Persistable (Edit Keyboard) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Edit Keyboard) = (payload :: *) Source #

Persistable (Edit (Text :&: Keyboard)) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Edit (Text :&: Keyboard)) = (payload :: *) Source #

Methods

payload :: Payload (Edit (Text :&: Keyboard)) -> Object Source #

endpoint :: Payload (Edit (Text :&: Keyboard)) -> String Source #

persist :: FromJSON r => Payload (Edit (Text :&: Keyboard)) -> Telegram e r Source #

persist_ :: Payload (Edit (Text :&: Keyboard)) -> Telegram e () Source #

type Payload (Edit Text) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Edit Keyboard) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Edit (Text :&: Keyboard)) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Edit (Text :&: Keyboard)) = Edit (Text :&: Keyboard)

data Silently (todo :: * -> *) a Source #

Constructors

Silently a 
Instances
Persistable (Reply obj) => Persistable (Silently Reply obj :: *) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Silently Reply obj) = (payload :: *) Source #

Methods

payload :: Payload (Silently Reply obj) -> Object Source #

endpoint :: Payload (Silently Reply obj) -> String Source #

persist :: FromJSON r => Payload (Silently Reply obj) -> Telegram e r Source #

persist_ :: Payload (Silently Reply obj) -> Telegram e () Source #

Persistable (Send obj) => Persistable (Silently Send obj :: *) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Silently Send obj) = (payload :: *) Source #

Methods

payload :: Payload (Silently Send obj) -> Object Source #

endpoint :: Payload (Silently Send obj) -> String Source #

persist :: FromJSON r => Payload (Silently Send obj) -> Telegram e r Source #

persist_ :: Payload (Silently Send obj) -> Telegram e () Source #

Persistable (Forward obj) => Persistable (Silently (Forward :: * -> *) obj :: *) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

Associated Types

type Payload (Silently Forward obj) = (payload :: *) Source #

type Payload (Silently Reply obj :: *) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Silently Reply obj :: *) = Silently Reply (Payload (Reply obj))
type Payload (Silently Send obj :: *) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Silently Send obj :: *) = Silently Send (Payload (Send obj))
type Payload (Silently (Forward :: * -> *) obj :: *) Source # 
Instance details

Defined in Network.API.Telegram.Bot.Object.Update.Message

type Payload (Silently (Forward :: * -> *) obj :: *) = Silently (Forward :: * -> *) (Payload (Forward obj))