module Telegram.Bot.Simple.InlineKeyboard where

import           Data.Text        (Text)
import qualified Data.Text        as Text

import           Telegram.Bot.API

urlButton :: Text -> Text -> InlineKeyboardButton
urlButton :: Text -> Text -> InlineKeyboardButton
urlButton Text
label Text
url = (Text -> InlineKeyboardButton
labeledInlineKeyboardButton Text
label)
  { inlineKeyboardButtonUrl :: Maybe Text
inlineKeyboardButtonUrl = forall a. a -> Maybe a
Just Text
url}

callbackButton :: Text -> Text -> InlineKeyboardButton
callbackButton :: Text -> Text -> InlineKeyboardButton
callbackButton Text
label Text
data_ = (Text -> InlineKeyboardButton
labeledInlineKeyboardButton Text
label)
  { inlineKeyboardButtonCallbackData :: Maybe Text
inlineKeyboardButtonCallbackData = forall a. a -> Maybe a
Just Text
data_}

actionButton :: Show action => Text -> action -> InlineKeyboardButton
actionButton :: forall action.
Show action =>
Text -> action -> InlineKeyboardButton
actionButton Text
label = Text -> Text -> InlineKeyboardButton
callbackButton Text
label forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Text
Text.pack forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Show a => a -> String
show