module Stratosphere.Connect.Instance.AttributesProperty (
        AttributesProperty(..), mkAttributesProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data AttributesProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-instance-attributes.html>
    AttributesProperty {AttributesProperty -> ()
haddock_workaround_ :: (),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-instance-attributes.html#cfn-connect-instance-attributes-autoresolvebestvoices>
                        AttributesProperty -> Maybe (Value Bool)
autoResolveBestVoices :: (Prelude.Maybe (Value Prelude.Bool)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-instance-attributes.html#cfn-connect-instance-attributes-contactlens>
                        AttributesProperty -> Maybe (Value Bool)
contactLens :: (Prelude.Maybe (Value Prelude.Bool)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-instance-attributes.html#cfn-connect-instance-attributes-contactflowlogs>
                        AttributesProperty -> Maybe (Value Bool)
contactflowLogs :: (Prelude.Maybe (Value Prelude.Bool)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-instance-attributes.html#cfn-connect-instance-attributes-earlymedia>
                        AttributesProperty -> Maybe (Value Bool)
earlyMedia :: (Prelude.Maybe (Value Prelude.Bool)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-instance-attributes.html#cfn-connect-instance-attributes-enhancedchatmonitoring>
                        AttributesProperty -> Maybe (Value Bool)
enhancedChatMonitoring :: (Prelude.Maybe (Value Prelude.Bool)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-instance-attributes.html#cfn-connect-instance-attributes-enhancedcontactmonitoring>
                        AttributesProperty -> Maybe (Value Bool)
enhancedContactMonitoring :: (Prelude.Maybe (Value Prelude.Bool)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-instance-attributes.html#cfn-connect-instance-attributes-highvolumeoutbound>
                        AttributesProperty -> Maybe (Value Bool)
highVolumeOutBound :: (Prelude.Maybe (Value Prelude.Bool)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-instance-attributes.html#cfn-connect-instance-attributes-inboundcalls>
                        AttributesProperty -> Value Bool
inboundCalls :: (Value Prelude.Bool),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-instance-attributes.html#cfn-connect-instance-attributes-multipartychatconference>
                        AttributesProperty -> Maybe (Value Bool)
multiPartyChatConference :: (Prelude.Maybe (Value Prelude.Bool)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-instance-attributes.html#cfn-connect-instance-attributes-multipartyconference>
                        AttributesProperty -> Maybe (Value Bool)
multiPartyConference :: (Prelude.Maybe (Value Prelude.Bool)),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-instance-attributes.html#cfn-connect-instance-attributes-outboundcalls>
                        AttributesProperty -> Value Bool
outboundCalls :: (Value Prelude.Bool),
                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-instance-attributes.html#cfn-connect-instance-attributes-usecustomttsvoices>
                        AttributesProperty -> Maybe (Value Bool)
useCustomTTSVoices :: (Prelude.Maybe (Value Prelude.Bool))}
  deriving stock (AttributesProperty -> AttributesProperty -> Bool
(AttributesProperty -> AttributesProperty -> Bool)
-> (AttributesProperty -> AttributesProperty -> Bool)
-> Eq AttributesProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: AttributesProperty -> AttributesProperty -> Bool
== :: AttributesProperty -> AttributesProperty -> Bool
$c/= :: AttributesProperty -> AttributesProperty -> Bool
/= :: AttributesProperty -> AttributesProperty -> Bool
Prelude.Eq, Int -> AttributesProperty -> ShowS
[AttributesProperty] -> ShowS
AttributesProperty -> String
(Int -> AttributesProperty -> ShowS)
-> (AttributesProperty -> String)
-> ([AttributesProperty] -> ShowS)
-> Show AttributesProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> AttributesProperty -> ShowS
showsPrec :: Int -> AttributesProperty -> ShowS
$cshow :: AttributesProperty -> String
show :: AttributesProperty -> String
$cshowList :: [AttributesProperty] -> ShowS
showList :: [AttributesProperty] -> ShowS
Prelude.Show)
mkAttributesProperty ::
  Value Prelude.Bool -> Value Prelude.Bool -> AttributesProperty
mkAttributesProperty :: Value Bool -> Value Bool -> AttributesProperty
mkAttributesProperty Value Bool
inboundCalls Value Bool
outboundCalls
  = AttributesProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), inboundCalls :: Value Bool
inboundCalls = Value Bool
inboundCalls,
       outboundCalls :: Value Bool
outboundCalls = Value Bool
outboundCalls,
       autoResolveBestVoices :: Maybe (Value Bool)
autoResolveBestVoices = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       contactLens :: Maybe (Value Bool)
contactLens = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing, contactflowLogs :: Maybe (Value Bool)
contactflowLogs = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       earlyMedia :: Maybe (Value Bool)
earlyMedia = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       enhancedChatMonitoring :: Maybe (Value Bool)
enhancedChatMonitoring = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       enhancedContactMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       highVolumeOutBound :: Maybe (Value Bool)
highVolumeOutBound = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       multiPartyChatConference :: Maybe (Value Bool)
multiPartyChatConference = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       multiPartyConference :: Maybe (Value Bool)
multiPartyConference = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       useCustomTTSVoices :: Maybe (Value Bool)
useCustomTTSVoices = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties AttributesProperty where
  toResourceProperties :: AttributesProperty -> ResourceProperties
toResourceProperties AttributesProperty {Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: AttributesProperty -> ()
autoResolveBestVoices :: AttributesProperty -> Maybe (Value Bool)
contactLens :: AttributesProperty -> Maybe (Value Bool)
contactflowLogs :: AttributesProperty -> Maybe (Value Bool)
earlyMedia :: AttributesProperty -> Maybe (Value Bool)
enhancedChatMonitoring :: AttributesProperty -> Maybe (Value Bool)
enhancedContactMonitoring :: AttributesProperty -> Maybe (Value Bool)
highVolumeOutBound :: AttributesProperty -> Maybe (Value Bool)
inboundCalls :: AttributesProperty -> Value Bool
multiPartyChatConference :: AttributesProperty -> Maybe (Value Bool)
multiPartyConference :: AttributesProperty -> Maybe (Value Bool)
outboundCalls :: AttributesProperty -> Value Bool
useCustomTTSVoices :: AttributesProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::Connect::Instance.Attributes",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
                        ([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
                           [Key
"InboundCalls" Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Bool
inboundCalls,
                            Key
"OutboundCalls" Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Bool
outboundCalls]
                           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                              [Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AutoResolveBestVoices"
                                 (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
autoResolveBestVoices,
                               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ContactLens" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
contactLens,
                               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ContactflowLogs" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
contactflowLogs,
                               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EarlyMedia" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
earlyMedia,
                               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EnhancedChatMonitoring"
                                 (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
enhancedChatMonitoring,
                               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EnhancedContactMonitoring"
                                 (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
enhancedContactMonitoring,
                               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"HighVolumeOutBound" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
highVolumeOutBound,
                               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MultiPartyChatConference"
                                 (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
multiPartyChatConference,
                               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MultiPartyConference" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
multiPartyConference,
                               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"UseCustomTTSVoices" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
useCustomTTSVoices]))}
instance JSON.ToJSON AttributesProperty where
  toJSON :: AttributesProperty -> Value
toJSON AttributesProperty {Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: AttributesProperty -> ()
autoResolveBestVoices :: AttributesProperty -> Maybe (Value Bool)
contactLens :: AttributesProperty -> Maybe (Value Bool)
contactflowLogs :: AttributesProperty -> Maybe (Value Bool)
earlyMedia :: AttributesProperty -> Maybe (Value Bool)
enhancedChatMonitoring :: AttributesProperty -> Maybe (Value Bool)
enhancedContactMonitoring :: AttributesProperty -> Maybe (Value Bool)
highVolumeOutBound :: AttributesProperty -> Maybe (Value Bool)
inboundCalls :: AttributesProperty -> Value Bool
multiPartyChatConference :: AttributesProperty -> Maybe (Value Bool)
multiPartyConference :: AttributesProperty -> Maybe (Value Bool)
outboundCalls :: AttributesProperty -> Value Bool
useCustomTTSVoices :: AttributesProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
    = [(Key, Value)] -> Value
JSON.object
        ([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
           ([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
              [Key
"InboundCalls" Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Bool
inboundCalls,
               Key
"OutboundCalls" Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Bool
outboundCalls]
              ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                 [Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AutoResolveBestVoices"
                    (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
autoResolveBestVoices,
                  Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ContactLens" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
contactLens,
                  Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ContactflowLogs" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
contactflowLogs,
                  Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EarlyMedia" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
earlyMedia,
                  Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EnhancedChatMonitoring"
                    (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
enhancedChatMonitoring,
                  Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EnhancedContactMonitoring"
                    (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
enhancedContactMonitoring,
                  Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"HighVolumeOutBound" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
highVolumeOutBound,
                  Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MultiPartyChatConference"
                    (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
multiPartyChatConference,
                  Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MultiPartyConference" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
multiPartyConference,
                  Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"UseCustomTTSVoices" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
useCustomTTSVoices])))
instance Property "AutoResolveBestVoices" AttributesProperty where
  type PropertyType "AutoResolveBestVoices" AttributesProperty = Value Prelude.Bool
  set :: PropertyType "AutoResolveBestVoices" AttributesProperty
-> AttributesProperty -> AttributesProperty
set PropertyType "AutoResolveBestVoices" AttributesProperty
newValue AttributesProperty {Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: AttributesProperty -> ()
autoResolveBestVoices :: AttributesProperty -> Maybe (Value Bool)
contactLens :: AttributesProperty -> Maybe (Value Bool)
contactflowLogs :: AttributesProperty -> Maybe (Value Bool)
earlyMedia :: AttributesProperty -> Maybe (Value Bool)
enhancedChatMonitoring :: AttributesProperty -> Maybe (Value Bool)
enhancedContactMonitoring :: AttributesProperty -> Maybe (Value Bool)
highVolumeOutBound :: AttributesProperty -> Maybe (Value Bool)
inboundCalls :: AttributesProperty -> Value Bool
multiPartyChatConference :: AttributesProperty -> Maybe (Value Bool)
multiPartyConference :: AttributesProperty -> Maybe (Value Bool)
outboundCalls :: AttributesProperty -> Value Bool
useCustomTTSVoices :: AttributesProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
    = AttributesProperty
        {autoResolveBestVoices :: Maybe (Value Bool)
autoResolveBestVoices = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AutoResolveBestVoices" AttributesProperty
Value Bool
newValue, Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: ()
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
haddock_workaround_ :: ()
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
instance Property "ContactLens" AttributesProperty where
  type PropertyType "ContactLens" AttributesProperty = Value Prelude.Bool
  set :: PropertyType "ContactLens" AttributesProperty
-> AttributesProperty -> AttributesProperty
set PropertyType "ContactLens" AttributesProperty
newValue AttributesProperty {Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: AttributesProperty -> ()
autoResolveBestVoices :: AttributesProperty -> Maybe (Value Bool)
contactLens :: AttributesProperty -> Maybe (Value Bool)
contactflowLogs :: AttributesProperty -> Maybe (Value Bool)
earlyMedia :: AttributesProperty -> Maybe (Value Bool)
enhancedChatMonitoring :: AttributesProperty -> Maybe (Value Bool)
enhancedContactMonitoring :: AttributesProperty -> Maybe (Value Bool)
highVolumeOutBound :: AttributesProperty -> Maybe (Value Bool)
inboundCalls :: AttributesProperty -> Value Bool
multiPartyChatConference :: AttributesProperty -> Maybe (Value Bool)
multiPartyConference :: AttributesProperty -> Maybe (Value Bool)
outboundCalls :: AttributesProperty -> Value Bool
useCustomTTSVoices :: AttributesProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
    = AttributesProperty {contactLens :: Maybe (Value Bool)
contactLens = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ContactLens" AttributesProperty
Value Bool
newValue, Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
instance Property "ContactflowLogs" AttributesProperty where
  type PropertyType "ContactflowLogs" AttributesProperty = Value Prelude.Bool
  set :: PropertyType "ContactflowLogs" AttributesProperty
-> AttributesProperty -> AttributesProperty
set PropertyType "ContactflowLogs" AttributesProperty
newValue AttributesProperty {Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: AttributesProperty -> ()
autoResolveBestVoices :: AttributesProperty -> Maybe (Value Bool)
contactLens :: AttributesProperty -> Maybe (Value Bool)
contactflowLogs :: AttributesProperty -> Maybe (Value Bool)
earlyMedia :: AttributesProperty -> Maybe (Value Bool)
enhancedChatMonitoring :: AttributesProperty -> Maybe (Value Bool)
enhancedContactMonitoring :: AttributesProperty -> Maybe (Value Bool)
highVolumeOutBound :: AttributesProperty -> Maybe (Value Bool)
inboundCalls :: AttributesProperty -> Value Bool
multiPartyChatConference :: AttributesProperty -> Maybe (Value Bool)
multiPartyConference :: AttributesProperty -> Maybe (Value Bool)
outboundCalls :: AttributesProperty -> Value Bool
useCustomTTSVoices :: AttributesProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
    = AttributesProperty {contactflowLogs :: Maybe (Value Bool)
contactflowLogs = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ContactflowLogs" AttributesProperty
Value Bool
newValue, Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
instance Property "EarlyMedia" AttributesProperty where
  type PropertyType "EarlyMedia" AttributesProperty = Value Prelude.Bool
  set :: PropertyType "EarlyMedia" AttributesProperty
-> AttributesProperty -> AttributesProperty
set PropertyType "EarlyMedia" AttributesProperty
newValue AttributesProperty {Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: AttributesProperty -> ()
autoResolveBestVoices :: AttributesProperty -> Maybe (Value Bool)
contactLens :: AttributesProperty -> Maybe (Value Bool)
contactflowLogs :: AttributesProperty -> Maybe (Value Bool)
earlyMedia :: AttributesProperty -> Maybe (Value Bool)
enhancedChatMonitoring :: AttributesProperty -> Maybe (Value Bool)
enhancedContactMonitoring :: AttributesProperty -> Maybe (Value Bool)
highVolumeOutBound :: AttributesProperty -> Maybe (Value Bool)
inboundCalls :: AttributesProperty -> Value Bool
multiPartyChatConference :: AttributesProperty -> Maybe (Value Bool)
multiPartyConference :: AttributesProperty -> Maybe (Value Bool)
outboundCalls :: AttributesProperty -> Value Bool
useCustomTTSVoices :: AttributesProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
    = AttributesProperty {earlyMedia :: Maybe (Value Bool)
earlyMedia = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "EarlyMedia" AttributesProperty
Value Bool
newValue, Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
instance Property "EnhancedChatMonitoring" AttributesProperty where
  type PropertyType "EnhancedChatMonitoring" AttributesProperty = Value Prelude.Bool
  set :: PropertyType "EnhancedChatMonitoring" AttributesProperty
-> AttributesProperty -> AttributesProperty
set PropertyType "EnhancedChatMonitoring" AttributesProperty
newValue AttributesProperty {Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: AttributesProperty -> ()
autoResolveBestVoices :: AttributesProperty -> Maybe (Value Bool)
contactLens :: AttributesProperty -> Maybe (Value Bool)
contactflowLogs :: AttributesProperty -> Maybe (Value Bool)
earlyMedia :: AttributesProperty -> Maybe (Value Bool)
enhancedChatMonitoring :: AttributesProperty -> Maybe (Value Bool)
enhancedContactMonitoring :: AttributesProperty -> Maybe (Value Bool)
highVolumeOutBound :: AttributesProperty -> Maybe (Value Bool)
inboundCalls :: AttributesProperty -> Value Bool
multiPartyChatConference :: AttributesProperty -> Maybe (Value Bool)
multiPartyConference :: AttributesProperty -> Maybe (Value Bool)
outboundCalls :: AttributesProperty -> Value Bool
useCustomTTSVoices :: AttributesProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
    = AttributesProperty
        {enhancedChatMonitoring :: Maybe (Value Bool)
enhancedChatMonitoring = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "EnhancedChatMonitoring" AttributesProperty
Value Bool
newValue, Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
instance Property "EnhancedContactMonitoring" AttributesProperty where
  type PropertyType "EnhancedContactMonitoring" AttributesProperty = Value Prelude.Bool
  set :: PropertyType "EnhancedContactMonitoring" AttributesProperty
-> AttributesProperty -> AttributesProperty
set PropertyType "EnhancedContactMonitoring" AttributesProperty
newValue AttributesProperty {Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: AttributesProperty -> ()
autoResolveBestVoices :: AttributesProperty -> Maybe (Value Bool)
contactLens :: AttributesProperty -> Maybe (Value Bool)
contactflowLogs :: AttributesProperty -> Maybe (Value Bool)
earlyMedia :: AttributesProperty -> Maybe (Value Bool)
enhancedChatMonitoring :: AttributesProperty -> Maybe (Value Bool)
enhancedContactMonitoring :: AttributesProperty -> Maybe (Value Bool)
highVolumeOutBound :: AttributesProperty -> Maybe (Value Bool)
inboundCalls :: AttributesProperty -> Value Bool
multiPartyChatConference :: AttributesProperty -> Maybe (Value Bool)
multiPartyConference :: AttributesProperty -> Maybe (Value Bool)
outboundCalls :: AttributesProperty -> Value Bool
useCustomTTSVoices :: AttributesProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
    = AttributesProperty
        {enhancedContactMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "EnhancedContactMonitoring" AttributesProperty
Value Bool
newValue, Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
instance Property "HighVolumeOutBound" AttributesProperty where
  type PropertyType "HighVolumeOutBound" AttributesProperty = Value Prelude.Bool
  set :: PropertyType "HighVolumeOutBound" AttributesProperty
-> AttributesProperty -> AttributesProperty
set PropertyType "HighVolumeOutBound" AttributesProperty
newValue AttributesProperty {Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: AttributesProperty -> ()
autoResolveBestVoices :: AttributesProperty -> Maybe (Value Bool)
contactLens :: AttributesProperty -> Maybe (Value Bool)
contactflowLogs :: AttributesProperty -> Maybe (Value Bool)
earlyMedia :: AttributesProperty -> Maybe (Value Bool)
enhancedChatMonitoring :: AttributesProperty -> Maybe (Value Bool)
enhancedContactMonitoring :: AttributesProperty -> Maybe (Value Bool)
highVolumeOutBound :: AttributesProperty -> Maybe (Value Bool)
inboundCalls :: AttributesProperty -> Value Bool
multiPartyChatConference :: AttributesProperty -> Maybe (Value Bool)
multiPartyConference :: AttributesProperty -> Maybe (Value Bool)
outboundCalls :: AttributesProperty -> Value Bool
useCustomTTSVoices :: AttributesProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
    = AttributesProperty
        {highVolumeOutBound :: Maybe (Value Bool)
highVolumeOutBound = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "HighVolumeOutBound" AttributesProperty
Value Bool
newValue, Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
instance Property "InboundCalls" AttributesProperty where
  type PropertyType "InboundCalls" AttributesProperty = Value Prelude.Bool
  set :: PropertyType "InboundCalls" AttributesProperty
-> AttributesProperty -> AttributesProperty
set PropertyType "InboundCalls" AttributesProperty
newValue AttributesProperty {Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: AttributesProperty -> ()
autoResolveBestVoices :: AttributesProperty -> Maybe (Value Bool)
contactLens :: AttributesProperty -> Maybe (Value Bool)
contactflowLogs :: AttributesProperty -> Maybe (Value Bool)
earlyMedia :: AttributesProperty -> Maybe (Value Bool)
enhancedChatMonitoring :: AttributesProperty -> Maybe (Value Bool)
enhancedContactMonitoring :: AttributesProperty -> Maybe (Value Bool)
highVolumeOutBound :: AttributesProperty -> Maybe (Value Bool)
inboundCalls :: AttributesProperty -> Value Bool
multiPartyChatConference :: AttributesProperty -> Maybe (Value Bool)
multiPartyConference :: AttributesProperty -> Maybe (Value Bool)
outboundCalls :: AttributesProperty -> Value Bool
useCustomTTSVoices :: AttributesProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
    = AttributesProperty {inboundCalls :: Value Bool
inboundCalls = PropertyType "InboundCalls" AttributesProperty
Value Bool
newValue, Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
instance Property "MultiPartyChatConference" AttributesProperty where
  type PropertyType "MultiPartyChatConference" AttributesProperty = Value Prelude.Bool
  set :: PropertyType "MultiPartyChatConference" AttributesProperty
-> AttributesProperty -> AttributesProperty
set PropertyType "MultiPartyChatConference" AttributesProperty
newValue AttributesProperty {Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: AttributesProperty -> ()
autoResolveBestVoices :: AttributesProperty -> Maybe (Value Bool)
contactLens :: AttributesProperty -> Maybe (Value Bool)
contactflowLogs :: AttributesProperty -> Maybe (Value Bool)
earlyMedia :: AttributesProperty -> Maybe (Value Bool)
enhancedChatMonitoring :: AttributesProperty -> Maybe (Value Bool)
enhancedContactMonitoring :: AttributesProperty -> Maybe (Value Bool)
highVolumeOutBound :: AttributesProperty -> Maybe (Value Bool)
inboundCalls :: AttributesProperty -> Value Bool
multiPartyChatConference :: AttributesProperty -> Maybe (Value Bool)
multiPartyConference :: AttributesProperty -> Maybe (Value Bool)
outboundCalls :: AttributesProperty -> Value Bool
useCustomTTSVoices :: AttributesProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
    = AttributesProperty
        {multiPartyChatConference :: Maybe (Value Bool)
multiPartyChatConference = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "MultiPartyChatConference" AttributesProperty
Value Bool
newValue, Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
instance Property "MultiPartyConference" AttributesProperty where
  type PropertyType "MultiPartyConference" AttributesProperty = Value Prelude.Bool
  set :: PropertyType "MultiPartyConference" AttributesProperty
-> AttributesProperty -> AttributesProperty
set PropertyType "MultiPartyConference" AttributesProperty
newValue AttributesProperty {Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: AttributesProperty -> ()
autoResolveBestVoices :: AttributesProperty -> Maybe (Value Bool)
contactLens :: AttributesProperty -> Maybe (Value Bool)
contactflowLogs :: AttributesProperty -> Maybe (Value Bool)
earlyMedia :: AttributesProperty -> Maybe (Value Bool)
enhancedChatMonitoring :: AttributesProperty -> Maybe (Value Bool)
enhancedContactMonitoring :: AttributesProperty -> Maybe (Value Bool)
highVolumeOutBound :: AttributesProperty -> Maybe (Value Bool)
inboundCalls :: AttributesProperty -> Value Bool
multiPartyChatConference :: AttributesProperty -> Maybe (Value Bool)
multiPartyConference :: AttributesProperty -> Maybe (Value Bool)
outboundCalls :: AttributesProperty -> Value Bool
useCustomTTSVoices :: AttributesProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
    = AttributesProperty
        {multiPartyConference :: Maybe (Value Bool)
multiPartyConference = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "MultiPartyConference" AttributesProperty
Value Bool
newValue, Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
instance Property "OutboundCalls" AttributesProperty where
  type PropertyType "OutboundCalls" AttributesProperty = Value Prelude.Bool
  set :: PropertyType "OutboundCalls" AttributesProperty
-> AttributesProperty -> AttributesProperty
set PropertyType "OutboundCalls" AttributesProperty
newValue AttributesProperty {Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: AttributesProperty -> ()
autoResolveBestVoices :: AttributesProperty -> Maybe (Value Bool)
contactLens :: AttributesProperty -> Maybe (Value Bool)
contactflowLogs :: AttributesProperty -> Maybe (Value Bool)
earlyMedia :: AttributesProperty -> Maybe (Value Bool)
enhancedChatMonitoring :: AttributesProperty -> Maybe (Value Bool)
enhancedContactMonitoring :: AttributesProperty -> Maybe (Value Bool)
highVolumeOutBound :: AttributesProperty -> Maybe (Value Bool)
inboundCalls :: AttributesProperty -> Value Bool
multiPartyChatConference :: AttributesProperty -> Maybe (Value Bool)
multiPartyConference :: AttributesProperty -> Maybe (Value Bool)
outboundCalls :: AttributesProperty -> Value Bool
useCustomTTSVoices :: AttributesProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
    = AttributesProperty {outboundCalls :: Value Bool
outboundCalls = PropertyType "OutboundCalls" AttributesProperty
Value Bool
newValue, Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
useCustomTTSVoices :: Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
useCustomTTSVoices :: Maybe (Value Bool)
..}
instance Property "UseCustomTTSVoices" AttributesProperty where
  type PropertyType "UseCustomTTSVoices" AttributesProperty = Value Prelude.Bool
  set :: PropertyType "UseCustomTTSVoices" AttributesProperty
-> AttributesProperty -> AttributesProperty
set PropertyType "UseCustomTTSVoices" AttributesProperty
newValue AttributesProperty {Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: AttributesProperty -> ()
autoResolveBestVoices :: AttributesProperty -> Maybe (Value Bool)
contactLens :: AttributesProperty -> Maybe (Value Bool)
contactflowLogs :: AttributesProperty -> Maybe (Value Bool)
earlyMedia :: AttributesProperty -> Maybe (Value Bool)
enhancedChatMonitoring :: AttributesProperty -> Maybe (Value Bool)
enhancedContactMonitoring :: AttributesProperty -> Maybe (Value Bool)
highVolumeOutBound :: AttributesProperty -> Maybe (Value Bool)
inboundCalls :: AttributesProperty -> Value Bool
multiPartyChatConference :: AttributesProperty -> Maybe (Value Bool)
multiPartyConference :: AttributesProperty -> Maybe (Value Bool)
outboundCalls :: AttributesProperty -> Value Bool
useCustomTTSVoices :: AttributesProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
useCustomTTSVoices :: Maybe (Value Bool)
..}
    = AttributesProperty
        {useCustomTTSVoices :: Maybe (Value Bool)
useCustomTTSVoices = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "UseCustomTTSVoices" AttributesProperty
Value Bool
newValue, Maybe (Value Bool)
()
Value Bool
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
haddock_workaround_ :: ()
autoResolveBestVoices :: Maybe (Value Bool)
contactLens :: Maybe (Value Bool)
contactflowLogs :: Maybe (Value Bool)
earlyMedia :: Maybe (Value Bool)
enhancedChatMonitoring :: Maybe (Value Bool)
enhancedContactMonitoring :: Maybe (Value Bool)
highVolumeOutBound :: Maybe (Value Bool)
inboundCalls :: Value Bool
multiPartyChatConference :: Maybe (Value Bool)
multiPartyConference :: Maybe (Value Bool)
outboundCalls :: Value Bool
..}