module Stratosphere.MediaLive.Channel.InputAttachmentProperty (
module Exports, InputAttachmentProperty(..),
mkInputAttachmentProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.MediaLive.Channel.AutomaticInputFailoverSettingsProperty as Exports
import {-# SOURCE #-} Stratosphere.MediaLive.Channel.InputSettingsProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data InputAttachmentProperty
=
InputAttachmentProperty {InputAttachmentProperty -> ()
haddock_workaround_ :: (),
InputAttachmentProperty
-> Maybe AutomaticInputFailoverSettingsProperty
automaticInputFailoverSettings :: (Prelude.Maybe AutomaticInputFailoverSettingsProperty),
InputAttachmentProperty -> Maybe (Value Text)
inputAttachmentName :: (Prelude.Maybe (Value Prelude.Text)),
InputAttachmentProperty -> Maybe (Value Text)
inputId :: (Prelude.Maybe (Value Prelude.Text)),
InputAttachmentProperty -> Maybe InputSettingsProperty
inputSettings :: (Prelude.Maybe InputSettingsProperty),
InputAttachmentProperty -> Maybe (ValueList Text)
logicalInterfaceNames :: (Prelude.Maybe (ValueList Prelude.Text))}
deriving stock (InputAttachmentProperty -> InputAttachmentProperty -> Bool
(InputAttachmentProperty -> InputAttachmentProperty -> Bool)
-> (InputAttachmentProperty -> InputAttachmentProperty -> Bool)
-> Eq InputAttachmentProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: InputAttachmentProperty -> InputAttachmentProperty -> Bool
== :: InputAttachmentProperty -> InputAttachmentProperty -> Bool
$c/= :: InputAttachmentProperty -> InputAttachmentProperty -> Bool
/= :: InputAttachmentProperty -> InputAttachmentProperty -> Bool
Prelude.Eq, Int -> InputAttachmentProperty -> ShowS
[InputAttachmentProperty] -> ShowS
InputAttachmentProperty -> String
(Int -> InputAttachmentProperty -> ShowS)
-> (InputAttachmentProperty -> String)
-> ([InputAttachmentProperty] -> ShowS)
-> Show InputAttachmentProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> InputAttachmentProperty -> ShowS
showsPrec :: Int -> InputAttachmentProperty -> ShowS
$cshow :: InputAttachmentProperty -> String
show :: InputAttachmentProperty -> String
$cshowList :: [InputAttachmentProperty] -> ShowS
showList :: [InputAttachmentProperty] -> ShowS
Prelude.Show)
mkInputAttachmentProperty :: InputAttachmentProperty
mkInputAttachmentProperty :: InputAttachmentProperty
mkInputAttachmentProperty
= InputAttachmentProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (),
automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
automaticInputFailoverSettings = Maybe AutomaticInputFailoverSettingsProperty
forall a. Maybe a
Prelude.Nothing,
inputAttachmentName :: Maybe (Value Text)
inputAttachmentName = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, inputId :: Maybe (Value Text)
inputId = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
inputSettings :: Maybe InputSettingsProperty
inputSettings = Maybe InputSettingsProperty
forall a. Maybe a
Prelude.Nothing,
logicalInterfaceNames :: Maybe (ValueList Text)
logicalInterfaceNames = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties InputAttachmentProperty where
toResourceProperties :: InputAttachmentProperty -> ResourceProperties
toResourceProperties InputAttachmentProperty {Maybe (ValueList Text)
Maybe (Value Text)
Maybe AutomaticInputFailoverSettingsProperty
Maybe InputSettingsProperty
()
haddock_workaround_ :: InputAttachmentProperty -> ()
automaticInputFailoverSettings :: InputAttachmentProperty
-> Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: InputAttachmentProperty -> Maybe (Value Text)
inputId :: InputAttachmentProperty -> Maybe (Value Text)
inputSettings :: InputAttachmentProperty -> Maybe InputSettingsProperty
logicalInterfaceNames :: InputAttachmentProperty -> Maybe (ValueList Text)
haddock_workaround_ :: ()
automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: Maybe (Value Text)
inputId :: Maybe (Value Text)
inputSettings :: Maybe InputSettingsProperty
logicalInterfaceNames :: Maybe (ValueList Text)
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::MediaLive::Channel.InputAttachment",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
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 -> AutomaticInputFailoverSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AutomaticInputFailoverSettings"
(AutomaticInputFailoverSettingsProperty -> (Key, Value))
-> Maybe AutomaticInputFailoverSettingsProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AutomaticInputFailoverSettingsProperty
automaticInputFailoverSettings,
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
"InputAttachmentName" (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)
inputAttachmentName,
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
"InputId" (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)
inputId,
Key -> InputSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InputSettings" (InputSettingsProperty -> (Key, Value))
-> Maybe InputSettingsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe InputSettingsProperty
inputSettings,
Key -> ValueList 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
"LogicalInterfaceNames"
(ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
logicalInterfaceNames])}
instance JSON.ToJSON InputAttachmentProperty where
toJSON :: InputAttachmentProperty -> Value
toJSON InputAttachmentProperty {Maybe (ValueList Text)
Maybe (Value Text)
Maybe AutomaticInputFailoverSettingsProperty
Maybe InputSettingsProperty
()
haddock_workaround_ :: InputAttachmentProperty -> ()
automaticInputFailoverSettings :: InputAttachmentProperty
-> Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: InputAttachmentProperty -> Maybe (Value Text)
inputId :: InputAttachmentProperty -> Maybe (Value Text)
inputSettings :: InputAttachmentProperty -> Maybe InputSettingsProperty
logicalInterfaceNames :: InputAttachmentProperty -> Maybe (ValueList Text)
haddock_workaround_ :: ()
automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: Maybe (Value Text)
inputId :: Maybe (Value Text)
inputSettings :: Maybe InputSettingsProperty
logicalInterfaceNames :: Maybe (ValueList Text)
..}
= [(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 -> AutomaticInputFailoverSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AutomaticInputFailoverSettings"
(AutomaticInputFailoverSettingsProperty -> (Key, Value))
-> Maybe AutomaticInputFailoverSettingsProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AutomaticInputFailoverSettingsProperty
automaticInputFailoverSettings,
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
"InputAttachmentName" (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)
inputAttachmentName,
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
"InputId" (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)
inputId,
Key -> InputSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InputSettings" (InputSettingsProperty -> (Key, Value))
-> Maybe InputSettingsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe InputSettingsProperty
inputSettings,
Key -> ValueList 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
"LogicalInterfaceNames"
(ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
logicalInterfaceNames]))
instance Property "AutomaticInputFailoverSettings" InputAttachmentProperty where
type PropertyType "AutomaticInputFailoverSettings" InputAttachmentProperty = AutomaticInputFailoverSettingsProperty
set :: PropertyType
"AutomaticInputFailoverSettings" InputAttachmentProperty
-> InputAttachmentProperty -> InputAttachmentProperty
set PropertyType
"AutomaticInputFailoverSettings" InputAttachmentProperty
newValue InputAttachmentProperty {Maybe (ValueList Text)
Maybe (Value Text)
Maybe AutomaticInputFailoverSettingsProperty
Maybe InputSettingsProperty
()
haddock_workaround_ :: InputAttachmentProperty -> ()
automaticInputFailoverSettings :: InputAttachmentProperty
-> Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: InputAttachmentProperty -> Maybe (Value Text)
inputId :: InputAttachmentProperty -> Maybe (Value Text)
inputSettings :: InputAttachmentProperty -> Maybe InputSettingsProperty
logicalInterfaceNames :: InputAttachmentProperty -> Maybe (ValueList Text)
haddock_workaround_ :: ()
automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: Maybe (Value Text)
inputId :: Maybe (Value Text)
inputSettings :: Maybe InputSettingsProperty
logicalInterfaceNames :: Maybe (ValueList Text)
..}
= InputAttachmentProperty
{automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
automaticInputFailoverSettings = AutomaticInputFailoverSettingsProperty
-> Maybe AutomaticInputFailoverSettingsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"AutomaticInputFailoverSettings" InputAttachmentProperty
AutomaticInputFailoverSettingsProperty
newValue, Maybe (ValueList Text)
Maybe (Value Text)
Maybe InputSettingsProperty
()
haddock_workaround_ :: ()
inputAttachmentName :: Maybe (Value Text)
inputId :: Maybe (Value Text)
inputSettings :: Maybe InputSettingsProperty
logicalInterfaceNames :: Maybe (ValueList Text)
haddock_workaround_ :: ()
inputAttachmentName :: Maybe (Value Text)
inputId :: Maybe (Value Text)
inputSettings :: Maybe InputSettingsProperty
logicalInterfaceNames :: Maybe (ValueList Text)
..}
instance Property "InputAttachmentName" InputAttachmentProperty where
type PropertyType "InputAttachmentName" InputAttachmentProperty = Value Prelude.Text
set :: PropertyType "InputAttachmentName" InputAttachmentProperty
-> InputAttachmentProperty -> InputAttachmentProperty
set PropertyType "InputAttachmentName" InputAttachmentProperty
newValue InputAttachmentProperty {Maybe (ValueList Text)
Maybe (Value Text)
Maybe AutomaticInputFailoverSettingsProperty
Maybe InputSettingsProperty
()
haddock_workaround_ :: InputAttachmentProperty -> ()
automaticInputFailoverSettings :: InputAttachmentProperty
-> Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: InputAttachmentProperty -> Maybe (Value Text)
inputId :: InputAttachmentProperty -> Maybe (Value Text)
inputSettings :: InputAttachmentProperty -> Maybe InputSettingsProperty
logicalInterfaceNames :: InputAttachmentProperty -> Maybe (ValueList Text)
haddock_workaround_ :: ()
automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: Maybe (Value Text)
inputId :: Maybe (Value Text)
inputSettings :: Maybe InputSettingsProperty
logicalInterfaceNames :: Maybe (ValueList Text)
..}
= InputAttachmentProperty
{inputAttachmentName :: Maybe (Value Text)
inputAttachmentName = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "InputAttachmentName" InputAttachmentProperty
Value Text
newValue, Maybe (ValueList Text)
Maybe (Value Text)
Maybe AutomaticInputFailoverSettingsProperty
Maybe InputSettingsProperty
()
haddock_workaround_ :: ()
automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
inputId :: Maybe (Value Text)
inputSettings :: Maybe InputSettingsProperty
logicalInterfaceNames :: Maybe (ValueList Text)
haddock_workaround_ :: ()
automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
inputId :: Maybe (Value Text)
inputSettings :: Maybe InputSettingsProperty
logicalInterfaceNames :: Maybe (ValueList Text)
..}
instance Property "InputId" InputAttachmentProperty where
type PropertyType "InputId" InputAttachmentProperty = Value Prelude.Text
set :: PropertyType "InputId" InputAttachmentProperty
-> InputAttachmentProperty -> InputAttachmentProperty
set PropertyType "InputId" InputAttachmentProperty
newValue InputAttachmentProperty {Maybe (ValueList Text)
Maybe (Value Text)
Maybe AutomaticInputFailoverSettingsProperty
Maybe InputSettingsProperty
()
haddock_workaround_ :: InputAttachmentProperty -> ()
automaticInputFailoverSettings :: InputAttachmentProperty
-> Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: InputAttachmentProperty -> Maybe (Value Text)
inputId :: InputAttachmentProperty -> Maybe (Value Text)
inputSettings :: InputAttachmentProperty -> Maybe InputSettingsProperty
logicalInterfaceNames :: InputAttachmentProperty -> Maybe (ValueList Text)
haddock_workaround_ :: ()
automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: Maybe (Value Text)
inputId :: Maybe (Value Text)
inputSettings :: Maybe InputSettingsProperty
logicalInterfaceNames :: Maybe (ValueList Text)
..}
= InputAttachmentProperty {inputId :: Maybe (Value Text)
inputId = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "InputId" InputAttachmentProperty
Value Text
newValue, Maybe (ValueList Text)
Maybe (Value Text)
Maybe AutomaticInputFailoverSettingsProperty
Maybe InputSettingsProperty
()
haddock_workaround_ :: ()
automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: Maybe (Value Text)
inputSettings :: Maybe InputSettingsProperty
logicalInterfaceNames :: Maybe (ValueList Text)
haddock_workaround_ :: ()
automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: Maybe (Value Text)
inputSettings :: Maybe InputSettingsProperty
logicalInterfaceNames :: Maybe (ValueList Text)
..}
instance Property "InputSettings" InputAttachmentProperty where
type PropertyType "InputSettings" InputAttachmentProperty = InputSettingsProperty
set :: PropertyType "InputSettings" InputAttachmentProperty
-> InputAttachmentProperty -> InputAttachmentProperty
set PropertyType "InputSettings" InputAttachmentProperty
newValue InputAttachmentProperty {Maybe (ValueList Text)
Maybe (Value Text)
Maybe AutomaticInputFailoverSettingsProperty
Maybe InputSettingsProperty
()
haddock_workaround_ :: InputAttachmentProperty -> ()
automaticInputFailoverSettings :: InputAttachmentProperty
-> Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: InputAttachmentProperty -> Maybe (Value Text)
inputId :: InputAttachmentProperty -> Maybe (Value Text)
inputSettings :: InputAttachmentProperty -> Maybe InputSettingsProperty
logicalInterfaceNames :: InputAttachmentProperty -> Maybe (ValueList Text)
haddock_workaround_ :: ()
automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: Maybe (Value Text)
inputId :: Maybe (Value Text)
inputSettings :: Maybe InputSettingsProperty
logicalInterfaceNames :: Maybe (ValueList Text)
..}
= InputAttachmentProperty
{inputSettings :: Maybe InputSettingsProperty
inputSettings = InputSettingsProperty -> Maybe InputSettingsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "InputSettings" InputAttachmentProperty
InputSettingsProperty
newValue, Maybe (ValueList Text)
Maybe (Value Text)
Maybe AutomaticInputFailoverSettingsProperty
()
haddock_workaround_ :: ()
automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: Maybe (Value Text)
inputId :: Maybe (Value Text)
logicalInterfaceNames :: Maybe (ValueList Text)
haddock_workaround_ :: ()
automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: Maybe (Value Text)
inputId :: Maybe (Value Text)
logicalInterfaceNames :: Maybe (ValueList Text)
..}
instance Property "LogicalInterfaceNames" InputAttachmentProperty where
type PropertyType "LogicalInterfaceNames" InputAttachmentProperty = ValueList Prelude.Text
set :: PropertyType "LogicalInterfaceNames" InputAttachmentProperty
-> InputAttachmentProperty -> InputAttachmentProperty
set PropertyType "LogicalInterfaceNames" InputAttachmentProperty
newValue InputAttachmentProperty {Maybe (ValueList Text)
Maybe (Value Text)
Maybe AutomaticInputFailoverSettingsProperty
Maybe InputSettingsProperty
()
haddock_workaround_ :: InputAttachmentProperty -> ()
automaticInputFailoverSettings :: InputAttachmentProperty
-> Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: InputAttachmentProperty -> Maybe (Value Text)
inputId :: InputAttachmentProperty -> Maybe (Value Text)
inputSettings :: InputAttachmentProperty -> Maybe InputSettingsProperty
logicalInterfaceNames :: InputAttachmentProperty -> Maybe (ValueList Text)
haddock_workaround_ :: ()
automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: Maybe (Value Text)
inputId :: Maybe (Value Text)
inputSettings :: Maybe InputSettingsProperty
logicalInterfaceNames :: Maybe (ValueList Text)
..}
= InputAttachmentProperty
{logicalInterfaceNames :: Maybe (ValueList Text)
logicalInterfaceNames = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "LogicalInterfaceNames" InputAttachmentProperty
ValueList Text
newValue, Maybe (Value Text)
Maybe AutomaticInputFailoverSettingsProperty
Maybe InputSettingsProperty
()
haddock_workaround_ :: ()
automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: Maybe (Value Text)
inputId :: Maybe (Value Text)
inputSettings :: Maybe InputSettingsProperty
haddock_workaround_ :: ()
automaticInputFailoverSettings :: Maybe AutomaticInputFailoverSettingsProperty
inputAttachmentName :: Maybe (Value Text)
inputId :: Maybe (Value Text)
inputSettings :: Maybe InputSettingsProperty
..}