module Stratosphere.MediaLive.Channel (
module Exports, Channel(..), mkChannel
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.MediaLive.Channel.AnywhereSettingsProperty as Exports
import {-# SOURCE #-} Stratosphere.MediaLive.Channel.CdiInputSpecificationProperty as Exports
import {-# SOURCE #-} Stratosphere.MediaLive.Channel.ChannelEngineVersionRequestProperty as Exports
import {-# SOURCE #-} Stratosphere.MediaLive.Channel.EncoderSettingsProperty as Exports
import {-# SOURCE #-} Stratosphere.MediaLive.Channel.InputAttachmentProperty as Exports
import {-# SOURCE #-} Stratosphere.MediaLive.Channel.InputSpecificationProperty as Exports
import {-# SOURCE #-} Stratosphere.MediaLive.Channel.MaintenanceCreateSettingsProperty as Exports
import {-# SOURCE #-} Stratosphere.MediaLive.Channel.OutputDestinationProperty as Exports
import {-# SOURCE #-} Stratosphere.MediaLive.Channel.VpcOutputSettingsProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data Channel
=
Channel {Channel -> ()
haddock_workaround_ :: (),
Channel -> Maybe AnywhereSettingsProperty
anywhereSettings :: (Prelude.Maybe AnywhereSettingsProperty),
Channel -> Maybe CdiInputSpecificationProperty
cdiInputSpecification :: (Prelude.Maybe CdiInputSpecificationProperty),
Channel -> Maybe (Value Text)
channelClass :: (Prelude.Maybe (Value Prelude.Text)),
Channel -> Maybe ChannelEngineVersionRequestProperty
channelEngineVersion :: (Prelude.Maybe ChannelEngineVersionRequestProperty),
Channel -> Maybe [OutputDestinationProperty]
destinations :: (Prelude.Maybe [OutputDestinationProperty]),
Channel -> Maybe (Value Bool)
dryRun :: (Prelude.Maybe (Value Prelude.Bool)),
Channel -> Maybe EncoderSettingsProperty
encoderSettings :: (Prelude.Maybe EncoderSettingsProperty),
Channel -> Maybe [InputAttachmentProperty]
inputAttachments :: (Prelude.Maybe [InputAttachmentProperty]),
Channel -> Maybe InputSpecificationProperty
inputSpecification :: (Prelude.Maybe InputSpecificationProperty),
Channel -> Maybe (Value Text)
logLevel :: (Prelude.Maybe (Value Prelude.Text)),
Channel -> Maybe MaintenanceCreateSettingsProperty
maintenance :: (Prelude.Maybe MaintenanceCreateSettingsProperty),
Channel -> Maybe (Value Text)
name :: (Prelude.Maybe (Value Prelude.Text)),
Channel -> Maybe (Value Text)
roleArn :: (Prelude.Maybe (Value Prelude.Text)),
Channel -> Maybe Object
tags :: (Prelude.Maybe JSON.Object),
Channel -> Maybe VpcOutputSettingsProperty
vpc :: (Prelude.Maybe VpcOutputSettingsProperty)}
deriving stock (Channel -> Channel -> Bool
(Channel -> Channel -> Bool)
-> (Channel -> Channel -> Bool) -> Eq Channel
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Channel -> Channel -> Bool
== :: Channel -> Channel -> Bool
$c/= :: Channel -> Channel -> Bool
/= :: Channel -> Channel -> Bool
Prelude.Eq, Int -> Channel -> ShowS
[Channel] -> ShowS
Channel -> String
(Int -> Channel -> ShowS)
-> (Channel -> String) -> ([Channel] -> ShowS) -> Show Channel
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Channel -> ShowS
showsPrec :: Int -> Channel -> ShowS
$cshow :: Channel -> String
show :: Channel -> String
$cshowList :: [Channel] -> ShowS
showList :: [Channel] -> ShowS
Prelude.Show)
mkChannel :: Channel
mkChannel :: Channel
mkChannel
= Channel
{haddock_workaround_ :: ()
haddock_workaround_ = (), anywhereSettings :: Maybe AnywhereSettingsProperty
anywhereSettings = Maybe AnywhereSettingsProperty
forall a. Maybe a
Prelude.Nothing,
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
cdiInputSpecification = Maybe CdiInputSpecificationProperty
forall a. Maybe a
Prelude.Nothing,
channelClass :: Maybe (Value Text)
channelClass = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
channelEngineVersion = Maybe ChannelEngineVersionRequestProperty
forall a. Maybe a
Prelude.Nothing,
destinations :: Maybe [OutputDestinationProperty]
destinations = Maybe [OutputDestinationProperty]
forall a. Maybe a
Prelude.Nothing, dryRun :: Maybe (Value Bool)
dryRun = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
encoderSettings :: Maybe EncoderSettingsProperty
encoderSettings = Maybe EncoderSettingsProperty
forall a. Maybe a
Prelude.Nothing,
inputAttachments :: Maybe [InputAttachmentProperty]
inputAttachments = Maybe [InputAttachmentProperty]
forall a. Maybe a
Prelude.Nothing,
inputSpecification :: Maybe InputSpecificationProperty
inputSpecification = Maybe InputSpecificationProperty
forall a. Maybe a
Prelude.Nothing, logLevel :: Maybe (Value Text)
logLevel = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
maintenance :: Maybe MaintenanceCreateSettingsProperty
maintenance = Maybe MaintenanceCreateSettingsProperty
forall a. Maybe a
Prelude.Nothing, name :: Maybe (Value Text)
name = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
roleArn :: Maybe (Value Text)
roleArn = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, tags :: Maybe Object
tags = Maybe Object
forall a. Maybe a
Prelude.Nothing,
vpc :: Maybe VpcOutputSettingsProperty
vpc = Maybe VpcOutputSettingsProperty
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties Channel where
toResourceProperties :: Channel -> ResourceProperties
toResourceProperties Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::MediaLive::Channel", supportsTags :: Bool
supportsTags = Bool
Prelude.True,
properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> AnywhereSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AnywhereSettings" (AnywhereSettingsProperty -> (Key, Value))
-> Maybe AnywhereSettingsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AnywhereSettingsProperty
anywhereSettings,
Key -> CdiInputSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CdiInputSpecification"
(CdiInputSpecificationProperty -> (Key, Value))
-> Maybe CdiInputSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CdiInputSpecificationProperty
cdiInputSpecification,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ChannelClass" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
channelClass,
Key -> ChannelEngineVersionRequestProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ChannelEngineVersion" (ChannelEngineVersionRequestProperty -> (Key, Value))
-> Maybe ChannelEngineVersionRequestProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ChannelEngineVersionRequestProperty
channelEngineVersion,
Key -> [OutputDestinationProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Destinations" ([OutputDestinationProperty] -> (Key, Value))
-> Maybe [OutputDestinationProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [OutputDestinationProperty]
destinations,
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
"DryRun" (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)
dryRun,
Key -> EncoderSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EncoderSettings" (EncoderSettingsProperty -> (Key, Value))
-> Maybe EncoderSettingsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe EncoderSettingsProperty
encoderSettings,
Key -> [InputAttachmentProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InputAttachments" ([InputAttachmentProperty] -> (Key, Value))
-> Maybe [InputAttachmentProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [InputAttachmentProperty]
inputAttachments,
Key -> InputSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InputSpecification" (InputSpecificationProperty -> (Key, Value))
-> Maybe InputSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe InputSpecificationProperty
inputSpecification,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"LogLevel" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
logLevel,
Key -> MaintenanceCreateSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Maintenance" (MaintenanceCreateSettingsProperty -> (Key, Value))
-> Maybe MaintenanceCreateSettingsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MaintenanceCreateSettingsProperty
maintenance,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Name" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
name,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RoleArn" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
roleArn,
Key -> Object -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" (Object -> (Key, Value)) -> Maybe Object -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Object
tags,
Key -> VpcOutputSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Vpc" (VpcOutputSettingsProperty -> (Key, Value))
-> Maybe VpcOutputSettingsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe VpcOutputSettingsProperty
vpc])}
instance JSON.ToJSON Channel where
toJSON :: Channel -> Value
toJSON Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= [(Key, Value)] -> Value
JSON.object
([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> AnywhereSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AnywhereSettings" (AnywhereSettingsProperty -> (Key, Value))
-> Maybe AnywhereSettingsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AnywhereSettingsProperty
anywhereSettings,
Key -> CdiInputSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CdiInputSpecification"
(CdiInputSpecificationProperty -> (Key, Value))
-> Maybe CdiInputSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CdiInputSpecificationProperty
cdiInputSpecification,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ChannelClass" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
channelClass,
Key -> ChannelEngineVersionRequestProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ChannelEngineVersion" (ChannelEngineVersionRequestProperty -> (Key, Value))
-> Maybe ChannelEngineVersionRequestProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ChannelEngineVersionRequestProperty
channelEngineVersion,
Key -> [OutputDestinationProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Destinations" ([OutputDestinationProperty] -> (Key, Value))
-> Maybe [OutputDestinationProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [OutputDestinationProperty]
destinations,
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
"DryRun" (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)
dryRun,
Key -> EncoderSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EncoderSettings" (EncoderSettingsProperty -> (Key, Value))
-> Maybe EncoderSettingsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe EncoderSettingsProperty
encoderSettings,
Key -> [InputAttachmentProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InputAttachments" ([InputAttachmentProperty] -> (Key, Value))
-> Maybe [InputAttachmentProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [InputAttachmentProperty]
inputAttachments,
Key -> InputSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InputSpecification" (InputSpecificationProperty -> (Key, Value))
-> Maybe InputSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe InputSpecificationProperty
inputSpecification,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"LogLevel" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
logLevel,
Key -> MaintenanceCreateSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Maintenance" (MaintenanceCreateSettingsProperty -> (Key, Value))
-> Maybe MaintenanceCreateSettingsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MaintenanceCreateSettingsProperty
maintenance,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Name" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
name,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RoleArn" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
roleArn,
Key -> Object -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" (Object -> (Key, Value)) -> Maybe Object -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Object
tags,
Key -> VpcOutputSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Vpc" (VpcOutputSettingsProperty -> (Key, Value))
-> Maybe VpcOutputSettingsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe VpcOutputSettingsProperty
vpc]))
instance Property "AnywhereSettings" Channel where
type PropertyType "AnywhereSettings" Channel = AnywhereSettingsProperty
set :: PropertyType "AnywhereSettings" Channel -> Channel -> Channel
set PropertyType "AnywhereSettings" Channel
newValue Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= Channel {anywhereSettings :: Maybe AnywhereSettingsProperty
anywhereSettings = AnywhereSettingsProperty -> Maybe AnywhereSettingsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AnywhereSettings" Channel
AnywhereSettingsProperty
newValue, Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: ()
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
instance Property "CdiInputSpecification" Channel where
type PropertyType "CdiInputSpecification" Channel = CdiInputSpecificationProperty
set :: PropertyType "CdiInputSpecification" Channel -> Channel -> Channel
set PropertyType "CdiInputSpecification" Channel
newValue Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= Channel {cdiInputSpecification :: Maybe CdiInputSpecificationProperty
cdiInputSpecification = CdiInputSpecificationProperty
-> Maybe CdiInputSpecificationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CdiInputSpecification" Channel
CdiInputSpecificationProperty
newValue, Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
instance Property "ChannelClass" Channel where
type PropertyType "ChannelClass" Channel = Value Prelude.Text
set :: PropertyType "ChannelClass" Channel -> Channel -> Channel
set PropertyType "ChannelClass" Channel
newValue Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= Channel {channelClass :: Maybe (Value Text)
channelClass = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ChannelClass" Channel
Value Text
newValue, Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
instance Property "ChannelEngineVersion" Channel where
type PropertyType "ChannelEngineVersion" Channel = ChannelEngineVersionRequestProperty
set :: PropertyType "ChannelEngineVersion" Channel -> Channel -> Channel
set PropertyType "ChannelEngineVersion" Channel
newValue Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= Channel {channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
channelEngineVersion = ChannelEngineVersionRequestProperty
-> Maybe ChannelEngineVersionRequestProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ChannelEngineVersion" Channel
ChannelEngineVersionRequestProperty
newValue, Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
instance Property "Destinations" Channel where
type PropertyType "Destinations" Channel = [OutputDestinationProperty]
set :: PropertyType "Destinations" Channel -> Channel -> Channel
set PropertyType "Destinations" Channel
newValue Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= Channel {destinations :: Maybe [OutputDestinationProperty]
destinations = [OutputDestinationProperty] -> Maybe [OutputDestinationProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [OutputDestinationProperty]
PropertyType "Destinations" Channel
newValue, Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
instance Property "DryRun" Channel where
type PropertyType "DryRun" Channel = Value Prelude.Bool
set :: PropertyType "DryRun" Channel -> Channel -> Channel
set PropertyType "DryRun" Channel
newValue Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= Channel {dryRun :: Maybe (Value Bool)
dryRun = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DryRun" Channel
Value Bool
newValue, Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
instance Property "EncoderSettings" Channel where
type PropertyType "EncoderSettings" Channel = EncoderSettingsProperty
set :: PropertyType "EncoderSettings" Channel -> Channel -> Channel
set PropertyType "EncoderSettings" Channel
newValue Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= Channel {encoderSettings :: Maybe EncoderSettingsProperty
encoderSettings = EncoderSettingsProperty -> Maybe EncoderSettingsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "EncoderSettings" Channel
EncoderSettingsProperty
newValue, Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
()
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
instance Property "InputAttachments" Channel where
type PropertyType "InputAttachments" Channel = [InputAttachmentProperty]
set :: PropertyType "InputAttachments" Channel -> Channel -> Channel
set PropertyType "InputAttachments" Channel
newValue Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= Channel {inputAttachments :: Maybe [InputAttachmentProperty]
inputAttachments = [InputAttachmentProperty] -> Maybe [InputAttachmentProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [InputAttachmentProperty]
PropertyType "InputAttachments" Channel
newValue, Maybe [OutputDestinationProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
instance Property "InputSpecification" Channel where
type PropertyType "InputSpecification" Channel = InputSpecificationProperty
set :: PropertyType "InputSpecification" Channel -> Channel -> Channel
set PropertyType "InputSpecification" Channel
newValue Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= Channel {inputSpecification :: Maybe InputSpecificationProperty
inputSpecification = InputSpecificationProperty -> Maybe InputSpecificationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "InputSpecification" Channel
InputSpecificationProperty
newValue, Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
instance Property "LogLevel" Channel where
type PropertyType "LogLevel" Channel = Value Prelude.Text
set :: PropertyType "LogLevel" Channel -> Channel -> Channel
set PropertyType "LogLevel" Channel
newValue Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= Channel {logLevel :: Maybe (Value Text)
logLevel = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "LogLevel" Channel
Value Text
newValue, Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
instance Property "Maintenance" Channel where
type PropertyType "Maintenance" Channel = MaintenanceCreateSettingsProperty
set :: PropertyType "Maintenance" Channel -> Channel -> Channel
set PropertyType "Maintenance" Channel
newValue Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= Channel {maintenance :: Maybe MaintenanceCreateSettingsProperty
maintenance = MaintenanceCreateSettingsProperty
-> Maybe MaintenanceCreateSettingsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Maintenance" Channel
MaintenanceCreateSettingsProperty
newValue, Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
instance Property "Name" Channel where
type PropertyType "Name" Channel = Value Prelude.Text
set :: PropertyType "Name" Channel -> Channel -> Channel
set PropertyType "Name" Channel
newValue Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= Channel {name :: Maybe (Value Text)
name = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Name" Channel
Value Text
newValue, Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
instance Property "RoleArn" Channel where
type PropertyType "RoleArn" Channel = Value Prelude.Text
set :: PropertyType "RoleArn" Channel -> Channel -> Channel
set PropertyType "RoleArn" Channel
newValue Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= Channel {roleArn :: Maybe (Value Text)
roleArn = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "RoleArn" Channel
Value Text
newValue, Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
instance Property "Tags" Channel where
type PropertyType "Tags" Channel = JSON.Object
set :: PropertyType "Tags" Channel -> Channel -> Channel
set PropertyType "Tags" Channel
newValue Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= Channel {tags :: Maybe Object
tags = Object -> Maybe Object
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure Object
PropertyType "Tags" Channel
newValue, Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
vpc :: Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
vpc :: Maybe VpcOutputSettingsProperty
..}
instance Property "Vpc" Channel where
type PropertyType "Vpc" Channel = VpcOutputSettingsProperty
set :: PropertyType "Vpc" Channel -> Channel -> Channel
set PropertyType "Vpc" Channel
newValue Channel {Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe VpcOutputSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: Channel -> ()
anywhereSettings :: Channel -> Maybe AnywhereSettingsProperty
cdiInputSpecification :: Channel -> Maybe CdiInputSpecificationProperty
channelClass :: Channel -> Maybe (Value Text)
channelEngineVersion :: Channel -> Maybe ChannelEngineVersionRequestProperty
destinations :: Channel -> Maybe [OutputDestinationProperty]
dryRun :: Channel -> Maybe (Value Bool)
encoderSettings :: Channel -> Maybe EncoderSettingsProperty
inputAttachments :: Channel -> Maybe [InputAttachmentProperty]
inputSpecification :: Channel -> Maybe InputSpecificationProperty
logLevel :: Channel -> Maybe (Value Text)
maintenance :: Channel -> Maybe MaintenanceCreateSettingsProperty
name :: Channel -> Maybe (Value Text)
roleArn :: Channel -> Maybe (Value Text)
tags :: Channel -> Maybe Object
vpc :: Channel -> Maybe VpcOutputSettingsProperty
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
vpc :: Maybe VpcOutputSettingsProperty
..}
= Channel {vpc :: Maybe VpcOutputSettingsProperty
vpc = VpcOutputSettingsProperty -> Maybe VpcOutputSettingsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Vpc" Channel
VpcOutputSettingsProperty
newValue, Maybe [OutputDestinationProperty]
Maybe [InputAttachmentProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe AnywhereSettingsProperty
Maybe CdiInputSpecificationProperty
Maybe ChannelEngineVersionRequestProperty
Maybe InputSpecificationProperty
Maybe MaintenanceCreateSettingsProperty
Maybe EncoderSettingsProperty
()
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
haddock_workaround_ :: ()
anywhereSettings :: Maybe AnywhereSettingsProperty
cdiInputSpecification :: Maybe CdiInputSpecificationProperty
channelClass :: Maybe (Value Text)
channelEngineVersion :: Maybe ChannelEngineVersionRequestProperty
destinations :: Maybe [OutputDestinationProperty]
dryRun :: Maybe (Value Bool)
encoderSettings :: Maybe EncoderSettingsProperty
inputAttachments :: Maybe [InputAttachmentProperty]
inputSpecification :: Maybe InputSpecificationProperty
logLevel :: Maybe (Value Text)
maintenance :: Maybe MaintenanceCreateSettingsProperty
name :: Maybe (Value Text)
roleArn :: Maybe (Value Text)
tags :: Maybe Object
..}