Copyright | (c) Alexandre Moreno 2019-2021 |
---|---|
License | BSD-3-Clause |
Maintainer | alexmorenocano@gmail.com |
Stability | experimental |
Safe Haskell | None |
Language | Haskell2010 |
Synopsis
- newtype ChannelToken = ChannelToken {}
- newtype ChannelSecret = ChannelSecret {}
- newtype ChannelId = ChannelId {
- unChannelId :: Text
- data ChatType
- data Id :: ChatType -> * where
- type MessageId = Text
- newtype URL = URL Text
- data Message
- = MessageText {
- text :: Text
- quickReply :: Maybe QuickReply
- | MessageSticker {
- packageId :: Text
- stickerId :: Text
- quickReply :: Maybe QuickReply
- | MessageImage { }
- | MessageVideo { }
- | MessageAudio { }
- | MessageLocation { }
- | MessageFlex {
- altText :: Text
- contents :: Value
- quickReply :: Maybe QuickReply
- = MessageText {
- newtype ReplyToken = ReplyToken Text
- newtype LinkToken = LinkToken {}
- data ReplyMessageBody = ReplyMessageBody ReplyToken [Message]
- data PushMessageBody = forall a. PushMessageBody (Id a) [Message]
- data MulticastMessageBody = MulticastMessageBody [Id 'User] [Message]
- newtype BroadcastMessageBody = BroadcastMessageBody [Message]
- data Profile = Profile {
- displayName :: Text
- userId :: Text
- pictureUrl :: URL
- statusMessage :: Maybe Text
- newtype QuickReply = QuickReply {
- items :: [QuickReplyButton]
- data QuickReplyButton = QuickReplyButton {}
- data Action
- = ActionPostback {
- label :: Text
- postbackData :: Text
- displayText :: Text
- | ActionMessage { }
- | ActionUri { }
- | ActionCamera { }
- | ActionCameraRoll { }
- | ActionLocation { }
- = ActionPostback {
- data ClientCredentials = ClientCredentials {}
- data ShortLivedChannelToken = ShortLivedChannelToken {}
- newtype LineDate = LineDate {
- unLineDate :: Day
- data MessageCount = MessageCount {}
- newtype MessageQuota = MessageQuota {
- totalUsage :: Int
- data MemberIds = MemberIds {}
- data JPEG
- data RichMenuSize = RichMenuSize {}
- data RichMenuBounds = RichMenuBounds {}
- data RichMenuArea = RichMenuArea {
- bounds :: RichMenuBounds
- action :: Action
- data RichMenu = RichMenu {
- size :: RichMenuSize
- selected :: Bool
- name :: Text
- chatBarText :: Text
- areas :: [RichMenuArea]
- data RichMenuResponse = RichMenuResponse {
- richMenuId :: Text
- richMenu :: RichMenu
- newtype RichMenuId = RichMenuId {
- richMenuId :: Text
- newtype RichMenuResponseList = RichMenuResponseList {}
- data RichMenuBulkLinkBody = RichMenuBulkLinkBody {
- richMenuId :: Text
- userIds :: [Id 'User]
- newtype RichMenuBulkUnlinkBody = RichMenuBulkUnlinkBody {}
Documentation
newtype ChannelToken Source #
Instances
newtype ChannelSecret Source #
Instances
IsString ChannelSecret Source # | |
Defined in Line.Bot.Types fromString :: String -> ChannelSecret # | |
ToHttpApiData ChannelSecret Source # | |
Defined in Line.Bot.Types toUrlPiece :: ChannelSecret -> Text # toEncodedUrlPiece :: ChannelSecret -> Builder # toHeader :: ChannelSecret -> ByteString # toQueryParam :: ChannelSecret -> Text # |
Instances
Eq ChannelId Source # | |
Show ChannelId Source # | |
IsString ChannelId Source # | |
Defined in Line.Bot.Types fromString :: String -> ChannelId # | |
Generic ChannelId Source # | |
NFData ChannelId Source # | |
Defined in Line.Bot.Types | |
ToHttpApiData ChannelId Source # | |
Defined in Line.Bot.Types toUrlPiece :: ChannelId -> Text # toEncodedUrlPiece :: ChannelId -> Builder # toHeader :: ChannelId -> ByteString # toQueryParam :: ChannelId -> Text # | |
type Rep ChannelId Source # | |
Defined in Line.Bot.Types |
data Id :: ChatType -> * where Source #
ID of a chat user, group or room
Instances
Eq (Id a) Source # | |
Show (Id a) Source # | |
IsString (Id 'User) Source # | |
Defined in Line.Bot.Types fromString :: String -> Id 'User # | |
IsString (Id 'Group) Source # | |
Defined in Line.Bot.Types fromString :: String -> Id 'Group # | |
IsString (Id 'Room) Source # | |
Defined in Line.Bot.Types fromString :: String -> Id 'Room # | |
ToJSON (Id a) Source # | |
Defined in Line.Bot.Types | |
FromJSON (Id 'User) Source # | |
FromJSON (Id 'Group) Source # | |
FromJSON (Id 'Room) Source # | |
NFData (Id a) Source # | |
Defined in Line.Bot.Types | |
ToHttpApiData (Id a) Source # | |
Defined in Line.Bot.Types toUrlPiece :: Id a -> Text # toEncodedUrlPiece :: Id a -> Builder # toHeader :: Id a -> ByteString # toQueryParam :: Id a -> Text # | |
FromHttpApiData (Id 'User) Source # | |
Defined in Line.Bot.Types | |
FromHttpApiData (Id 'Group) Source # | |
Defined in Line.Bot.Types | |
FromHttpApiData (Id 'Room) Source # | |
Defined in Line.Bot.Types |
Instances
newtype ReplyToken Source #
Instances
data ReplyMessageBody Source #
Instances
data PushMessageBody Source #
forall a. PushMessageBody (Id a) [Message] |
Instances
Show PushMessageBody Source # | |
Defined in Line.Bot.Types showsPrec :: Int -> PushMessageBody -> ShowS # show :: PushMessageBody -> String # showList :: [PushMessageBody] -> ShowS # | |
ToJSON PushMessageBody Source # | |
Defined in Line.Bot.Types toJSON :: PushMessageBody -> Value # toEncoding :: PushMessageBody -> Encoding # toJSONList :: [PushMessageBody] -> Value # toEncodingList :: [PushMessageBody] -> Encoding # |
data MulticastMessageBody Source #
Instances
newtype BroadcastMessageBody Source #
Instances
Profile | |
|
Instances
Eq Profile Source # | |
Show Profile Source # | |
Generic Profile Source # | |
FromJSON Profile Source # | |
NFData Profile Source # | |
Defined in Line.Bot.Types | |
type Rep Profile Source # | |
Defined in Line.Bot.Types type Rep Profile = D1 ('MetaData "Profile" "Line.Bot.Types" "line-bot-sdk-0.7.2-F2yyxMh5BFY9DcEGbfR99r" 'False) (C1 ('MetaCons "Profile" 'PrefixI 'True) ((S1 ('MetaSel ('Just "displayName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "userId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "pictureUrl") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 URL) :*: S1 ('MetaSel ('Just "statusMessage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))) |
newtype QuickReply Source #
Instances
data QuickReplyButton Source #
Instances
ActionPostback | |
| |
ActionMessage | |
ActionUri | |
ActionCamera | |
ActionCameraRoll | |
ActionLocation | |
Instances
data ClientCredentials Source #
Instances
ToForm ClientCredentials Source # | |
Defined in Line.Bot.Types toForm :: ClientCredentials -> Form # |
data ShortLivedChannelToken Source #
Instances
Instances
Eq LineDate Source # | |
Show LineDate Source # | |
ToHttpApiData LineDate Source # | |
Defined in Line.Bot.Types toUrlPiece :: LineDate -> Text # toEncodedUrlPiece :: LineDate -> Builder # toHeader :: LineDate -> ByteString # toQueryParam :: LineDate -> Text # |
data MessageCount Source #
Instances
Eq MessageCount Source # | |
Defined in Line.Bot.Types (==) :: MessageCount -> MessageCount -> Bool # (/=) :: MessageCount -> MessageCount -> Bool # | |
Show MessageCount Source # | |
Defined in Line.Bot.Types showsPrec :: Int -> MessageCount -> ShowS # show :: MessageCount -> String # showList :: [MessageCount] -> ShowS # | |
FromJSON MessageCount Source # | |
Defined in Line.Bot.Types parseJSON :: Value -> Parser MessageCount # parseJSONList :: Value -> Parser [MessageCount] # |
newtype MessageQuota Source #
Instances
Instances
Eq MemberIds Source # | |
Show MemberIds Source # | |
Generic MemberIds Source # | |
FromJSON MemberIds Source # | |
NFData MemberIds Source # | |
Defined in Line.Bot.Types | |
type Rep MemberIds Source # | |
Defined in Line.Bot.Types type Rep MemberIds = D1 ('MetaData "MemberIds" "Line.Bot.Types" "line-bot-sdk-0.7.2-F2yyxMh5BFY9DcEGbfR99r" 'False) (C1 ('MetaCons "MemberIds" 'PrefixI 'True) (S1 ('MetaSel ('Just "memberIds") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Id 'User]) :*: S1 ('MetaSel ('Just "next") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)))) |
Instances
Accept JPEG Source # | |
Defined in Line.Bot.Types | |
MimeRender JPEG ByteString Source # | |
Defined in Line.Bot.Types mimeRender :: Proxy JPEG -> ByteString -> ByteString0 # |
data RichMenuSize Source #
Instances
data RichMenuBounds Source #
Instances
data RichMenuArea Source #
Instances
RichMenu | |
|
Instances
Eq RichMenu Source # | |
Show RichMenu Source # | |
Generic RichMenu Source # | |
ToJSON RichMenu Source # | |
Defined in Line.Bot.Types | |
FromJSON RichMenu Source # | |
NFData RichMenu Source # | |
Defined in Line.Bot.Types | |
type Rep RichMenu Source # | |
Defined in Line.Bot.Types type Rep RichMenu = D1 ('MetaData "RichMenu" "Line.Bot.Types" "line-bot-sdk-0.7.2-F2yyxMh5BFY9DcEGbfR99r" 'False) (C1 ('MetaCons "RichMenu" 'PrefixI 'True) ((S1 ('MetaSel ('Just "size") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RichMenuSize) :*: S1 ('MetaSel ('Just "selected") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "chatBarText") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "areas") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [RichMenuArea]))))) |
data RichMenuResponse Source #
Instances
newtype RichMenuId Source #
Instances
newtype RichMenuResponseList Source #
Instances
data RichMenuBulkLinkBody Source #
RichMenuBulkLinkBody | |
|
Instances
newtype RichMenuBulkUnlinkBody Source #