| Safe Haskell | Safe-Inferred |
|---|---|
| Language | Haskell2010 |
MSAzureAPI.ServiceBus
Synopsis
- sendMessageBatch :: ToJSON a => Text -> Text -> Text -> Option 'Https -> MessageBatch a -> AccessToken -> Req ()
- newtype MessageBatch a = MessageBatch [a]
- createTopic :: Text -> Text -> Text -> Text -> TopicCreate -> AccessToken -> Req ()
- data TopicCreate = TopicCreate {}
- data TCProperties = TCProperties {}
- createQueue :: Text -> Text -> Text -> Text -> AccessToken -> Req QueueCreateResponse
- data QueueCreateResponse = QueueCreateResponse {}
- data QCRProperties = QCRProperties {}
- createNamespace :: Text -> Text -> Text -> NameSpaceCreate -> AccessToken -> Req NameSpaceCreateResponse
- data NameSpaceCreate = NameSpaceCreate {}
- data NameSpaceCreateResponse = NameSpaceCreateResponse {}
- data NSCRProperties = NSCRProperties {}
- data Sku = Sku {}
- data SkuName
Documentation
Arguments
| :: ToJSON a | |
| => Text | namespace |
| -> Text | queue name |
| -> Text | topic |
| -> Option 'Https | |
| -> MessageBatch a | |
| -> AccessToken | |
| -> Req () |
Send a message batch to the service bus
https://learn.microsoft.com/en-us/rest/api/servicebus/send-message-batch#request
newtype MessageBatch a Source #
Constructors
| MessageBatch [a] |
Instances
| ToJSON a => ToJSON (MessageBatch a) Source # | |
Defined in MSAzureAPI.ServiceBus Methods toJSON :: MessageBatch a -> Value # toEncoding :: MessageBatch a -> Encoding # toJSONList :: [MessageBatch a] -> Value # toEncodingList :: [MessageBatch a] -> Encoding # | |
| IsList (MessageBatch a) Source # | |
Defined in MSAzureAPI.ServiceBus Associated Types type Item (MessageBatch a) # Methods fromList :: [Item (MessageBatch a)] -> MessageBatch a # fromListN :: Int -> [Item (MessageBatch a)] -> MessageBatch a # toList :: MessageBatch a -> [Item (MessageBatch a)] # | |
| Show a => Show (MessageBatch a) Source # | |
Defined in MSAzureAPI.ServiceBus Methods showsPrec :: Int -> MessageBatch a -> ShowS # show :: MessageBatch a -> String # showList :: [MessageBatch a] -> ShowS # | |
| Eq a => Eq (MessageBatch a) Source # | |
Defined in MSAzureAPI.ServiceBus Methods (==) :: MessageBatch a -> MessageBatch a -> Bool # (/=) :: MessageBatch a -> MessageBatch a -> Bool # | |
| type Item (MessageBatch a) Source # | |
Defined in MSAzureAPI.ServiceBus | |
Arguments
| :: Text | subscription id |
| -> Text | RG name |
| -> Text | namespace name |
| -> Text | topic name |
| -> TopicCreate | |
| -> AccessToken | |
| -> Req () |
data TopicCreate Source #
Constructors
| TopicCreate | |
Fields | |
Instances
| ToJSON TopicCreate Source # | |
Defined in MSAzureAPI.ServiceBus Methods toJSON :: TopicCreate -> Value # toEncoding :: TopicCreate -> Encoding # toJSONList :: [TopicCreate] -> Value # toEncodingList :: [TopicCreate] -> Encoding # | |
| Generic TopicCreate Source # | |
Defined in MSAzureAPI.ServiceBus Associated Types type Rep TopicCreate :: Type -> Type # | |
| Show TopicCreate Source # | |
Defined in MSAzureAPI.ServiceBus Methods showsPrec :: Int -> TopicCreate -> ShowS # show :: TopicCreate -> String # showList :: [TopicCreate] -> ShowS # | |
| Eq TopicCreate Source # | |
Defined in MSAzureAPI.ServiceBus | |
| type Rep TopicCreate Source # | |
Defined in MSAzureAPI.ServiceBus type Rep TopicCreate = D1 ('MetaData "TopicCreate" "MSAzureAPI.ServiceBus" "ms-azure-api-0.6.0.1-9AqtB8TNiqqGzZl2uZcaR4" 'False) (C1 ('MetaCons "TopicCreate" 'PrefixI 'True) (S1 ('MetaSel ('Just "tcProperties") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TCProperties))) | |
data TCProperties Source #
Constructors
| TCProperties | |
Fields
| |
Instances
| ToJSON TCProperties Source # | |
Defined in MSAzureAPI.ServiceBus Methods toJSON :: TCProperties -> Value # toEncoding :: TCProperties -> Encoding # toJSONList :: [TCProperties] -> Value # toEncodingList :: [TCProperties] -> Encoding # | |
| Generic TCProperties Source # | |
Defined in MSAzureAPI.ServiceBus Associated Types type Rep TCProperties :: Type -> Type # | |
| Show TCProperties Source # | |
Defined in MSAzureAPI.ServiceBus Methods showsPrec :: Int -> TCProperties -> ShowS # show :: TCProperties -> String # showList :: [TCProperties] -> ShowS # | |
| Eq TCProperties Source # | |
Defined in MSAzureAPI.ServiceBus | |
| type Rep TCProperties Source # | |
Defined in MSAzureAPI.ServiceBus type Rep TCProperties = D1 ('MetaData "TCProperties" "MSAzureAPI.ServiceBus" "ms-azure-api-0.6.0.1-9AqtB8TNiqqGzZl2uZcaR4" 'False) (C1 ('MetaCons "TCProperties" 'PrefixI 'True) (S1 ('MetaSel ('Just "tcpEnableBatchedOperations") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) | |
Arguments
| :: Text | subscription id |
| -> Text | RG name |
| -> Text | namespace name |
| -> Text | queue name |
| -> AccessToken | |
| -> Req QueueCreateResponse |
Create a service bus queue using default options
data QueueCreateResponse Source #
Constructors
| QueueCreateResponse | |
Fields
| |
Instances
data QCRProperties Source #
Constructors
| QCRProperties | |
Fields | |
Instances
Arguments
| :: Text | subscription id |
| -> Text | RG name |
| -> Text | namespace name |
| -> NameSpaceCreate | |
| -> AccessToken | |
| -> Req NameSpaceCreateResponse |
data NameSpaceCreate Source #
Constructors
| NameSpaceCreate | |
Instances
data NameSpaceCreateResponse Source #
Constructors
| NameSpaceCreateResponse | |
Fields | |
Instances
data NSCRProperties Source #
Constructors
| NSCRProperties | |
Fields | |
Instances
Instances
| ToJSON SkuName Source # | |
Defined in MSAzureAPI.ServiceBus | |
| Generic SkuName Source # | |
| Show SkuName Source # | |
| Eq SkuName Source # | |
| type Rep SkuName Source # | |
Defined in MSAzureAPI.ServiceBus type Rep SkuName = D1 ('MetaData "SkuName" "MSAzureAPI.ServiceBus" "ms-azure-api-0.6.0.1-9AqtB8TNiqqGzZl2uZcaR4" 'False) (C1 ('MetaCons "Basic" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Premium" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Standard" 'PrefixI 'False) (U1 :: Type -> Type))) | |