module Stratosphere.MediaLive.Channel.BlackoutSlateProperty (
module Exports, BlackoutSlateProperty(..), mkBlackoutSlateProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.MediaLive.Channel.InputLocationProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data BlackoutSlateProperty
=
BlackoutSlateProperty {BlackoutSlateProperty -> ()
haddock_workaround_ :: (),
BlackoutSlateProperty -> Maybe InputLocationProperty
blackoutSlateImage :: (Prelude.Maybe InputLocationProperty),
BlackoutSlateProperty -> Maybe (Value Text)
networkEndBlackout :: (Prelude.Maybe (Value Prelude.Text)),
BlackoutSlateProperty -> Maybe InputLocationProperty
networkEndBlackoutImage :: (Prelude.Maybe InputLocationProperty),
BlackoutSlateProperty -> Maybe (Value Text)
networkId :: (Prelude.Maybe (Value Prelude.Text)),
BlackoutSlateProperty -> Maybe (Value Text)
state :: (Prelude.Maybe (Value Prelude.Text))}
deriving stock (BlackoutSlateProperty -> BlackoutSlateProperty -> Bool
(BlackoutSlateProperty -> BlackoutSlateProperty -> Bool)
-> (BlackoutSlateProperty -> BlackoutSlateProperty -> Bool)
-> Eq BlackoutSlateProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: BlackoutSlateProperty -> BlackoutSlateProperty -> Bool
== :: BlackoutSlateProperty -> BlackoutSlateProperty -> Bool
$c/= :: BlackoutSlateProperty -> BlackoutSlateProperty -> Bool
/= :: BlackoutSlateProperty -> BlackoutSlateProperty -> Bool
Prelude.Eq, Int -> BlackoutSlateProperty -> ShowS
[BlackoutSlateProperty] -> ShowS
BlackoutSlateProperty -> String
(Int -> BlackoutSlateProperty -> ShowS)
-> (BlackoutSlateProperty -> String)
-> ([BlackoutSlateProperty] -> ShowS)
-> Show BlackoutSlateProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> BlackoutSlateProperty -> ShowS
showsPrec :: Int -> BlackoutSlateProperty -> ShowS
$cshow :: BlackoutSlateProperty -> String
show :: BlackoutSlateProperty -> String
$cshowList :: [BlackoutSlateProperty] -> ShowS
showList :: [BlackoutSlateProperty] -> ShowS
Prelude.Show)
mkBlackoutSlateProperty :: BlackoutSlateProperty
mkBlackoutSlateProperty :: BlackoutSlateProperty
mkBlackoutSlateProperty
= BlackoutSlateProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), blackoutSlateImage :: Maybe InputLocationProperty
blackoutSlateImage = Maybe InputLocationProperty
forall a. Maybe a
Prelude.Nothing,
networkEndBlackout :: Maybe (Value Text)
networkEndBlackout = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
networkEndBlackoutImage :: Maybe InputLocationProperty
networkEndBlackoutImage = Maybe InputLocationProperty
forall a. Maybe a
Prelude.Nothing,
networkId :: Maybe (Value Text)
networkId = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, state :: Maybe (Value Text)
state = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties BlackoutSlateProperty where
toResourceProperties :: BlackoutSlateProperty -> ResourceProperties
toResourceProperties BlackoutSlateProperty {Maybe (Value Text)
Maybe InputLocationProperty
()
haddock_workaround_ :: BlackoutSlateProperty -> ()
blackoutSlateImage :: BlackoutSlateProperty -> Maybe InputLocationProperty
networkEndBlackout :: BlackoutSlateProperty -> Maybe (Value Text)
networkEndBlackoutImage :: BlackoutSlateProperty -> Maybe InputLocationProperty
networkId :: BlackoutSlateProperty -> Maybe (Value Text)
state :: BlackoutSlateProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blackoutSlateImage :: Maybe InputLocationProperty
networkEndBlackout :: Maybe (Value Text)
networkEndBlackoutImage :: Maybe InputLocationProperty
networkId :: Maybe (Value Text)
state :: Maybe (Value Text)
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::MediaLive::Channel.BlackoutSlate",
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 -> InputLocationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BlackoutSlateImage" (InputLocationProperty -> (Key, Value))
-> Maybe InputLocationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe InputLocationProperty
blackoutSlateImage,
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
"NetworkEndBlackout" (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)
networkEndBlackout,
Key -> InputLocationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"NetworkEndBlackoutImage"
(InputLocationProperty -> (Key, Value))
-> Maybe InputLocationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe InputLocationProperty
networkEndBlackoutImage,
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
"NetworkId" (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)
networkId,
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
"State" (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)
state])}
instance JSON.ToJSON BlackoutSlateProperty where
toJSON :: BlackoutSlateProperty -> Value
toJSON BlackoutSlateProperty {Maybe (Value Text)
Maybe InputLocationProperty
()
haddock_workaround_ :: BlackoutSlateProperty -> ()
blackoutSlateImage :: BlackoutSlateProperty -> Maybe InputLocationProperty
networkEndBlackout :: BlackoutSlateProperty -> Maybe (Value Text)
networkEndBlackoutImage :: BlackoutSlateProperty -> Maybe InputLocationProperty
networkId :: BlackoutSlateProperty -> Maybe (Value Text)
state :: BlackoutSlateProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blackoutSlateImage :: Maybe InputLocationProperty
networkEndBlackout :: Maybe (Value Text)
networkEndBlackoutImage :: Maybe InputLocationProperty
networkId :: Maybe (Value Text)
state :: Maybe (Value 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 -> InputLocationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BlackoutSlateImage" (InputLocationProperty -> (Key, Value))
-> Maybe InputLocationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe InputLocationProperty
blackoutSlateImage,
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
"NetworkEndBlackout" (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)
networkEndBlackout,
Key -> InputLocationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"NetworkEndBlackoutImage"
(InputLocationProperty -> (Key, Value))
-> Maybe InputLocationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe InputLocationProperty
networkEndBlackoutImage,
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
"NetworkId" (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)
networkId,
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
"State" (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)
state]))
instance Property "BlackoutSlateImage" BlackoutSlateProperty where
type PropertyType "BlackoutSlateImage" BlackoutSlateProperty = InputLocationProperty
set :: PropertyType "BlackoutSlateImage" BlackoutSlateProperty
-> BlackoutSlateProperty -> BlackoutSlateProperty
set PropertyType "BlackoutSlateImage" BlackoutSlateProperty
newValue BlackoutSlateProperty {Maybe (Value Text)
Maybe InputLocationProperty
()
haddock_workaround_ :: BlackoutSlateProperty -> ()
blackoutSlateImage :: BlackoutSlateProperty -> Maybe InputLocationProperty
networkEndBlackout :: BlackoutSlateProperty -> Maybe (Value Text)
networkEndBlackoutImage :: BlackoutSlateProperty -> Maybe InputLocationProperty
networkId :: BlackoutSlateProperty -> Maybe (Value Text)
state :: BlackoutSlateProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blackoutSlateImage :: Maybe InputLocationProperty
networkEndBlackout :: Maybe (Value Text)
networkEndBlackoutImage :: Maybe InputLocationProperty
networkId :: Maybe (Value Text)
state :: Maybe (Value Text)
..}
= BlackoutSlateProperty
{blackoutSlateImage :: Maybe InputLocationProperty
blackoutSlateImage = InputLocationProperty -> Maybe InputLocationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "BlackoutSlateImage" BlackoutSlateProperty
InputLocationProperty
newValue, Maybe (Value Text)
Maybe InputLocationProperty
()
haddock_workaround_ :: ()
networkEndBlackout :: Maybe (Value Text)
networkEndBlackoutImage :: Maybe InputLocationProperty
networkId :: Maybe (Value Text)
state :: Maybe (Value Text)
haddock_workaround_ :: ()
networkEndBlackout :: Maybe (Value Text)
networkEndBlackoutImage :: Maybe InputLocationProperty
networkId :: Maybe (Value Text)
state :: Maybe (Value Text)
..}
instance Property "NetworkEndBlackout" BlackoutSlateProperty where
type PropertyType "NetworkEndBlackout" BlackoutSlateProperty = Value Prelude.Text
set :: PropertyType "NetworkEndBlackout" BlackoutSlateProperty
-> BlackoutSlateProperty -> BlackoutSlateProperty
set PropertyType "NetworkEndBlackout" BlackoutSlateProperty
newValue BlackoutSlateProperty {Maybe (Value Text)
Maybe InputLocationProperty
()
haddock_workaround_ :: BlackoutSlateProperty -> ()
blackoutSlateImage :: BlackoutSlateProperty -> Maybe InputLocationProperty
networkEndBlackout :: BlackoutSlateProperty -> Maybe (Value Text)
networkEndBlackoutImage :: BlackoutSlateProperty -> Maybe InputLocationProperty
networkId :: BlackoutSlateProperty -> Maybe (Value Text)
state :: BlackoutSlateProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blackoutSlateImage :: Maybe InputLocationProperty
networkEndBlackout :: Maybe (Value Text)
networkEndBlackoutImage :: Maybe InputLocationProperty
networkId :: Maybe (Value Text)
state :: Maybe (Value Text)
..}
= BlackoutSlateProperty
{networkEndBlackout :: Maybe (Value Text)
networkEndBlackout = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "NetworkEndBlackout" BlackoutSlateProperty
Value Text
newValue, Maybe (Value Text)
Maybe InputLocationProperty
()
haddock_workaround_ :: ()
blackoutSlateImage :: Maybe InputLocationProperty
networkEndBlackoutImage :: Maybe InputLocationProperty
networkId :: Maybe (Value Text)
state :: Maybe (Value Text)
haddock_workaround_ :: ()
blackoutSlateImage :: Maybe InputLocationProperty
networkEndBlackoutImage :: Maybe InputLocationProperty
networkId :: Maybe (Value Text)
state :: Maybe (Value Text)
..}
instance Property "NetworkEndBlackoutImage" BlackoutSlateProperty where
type PropertyType "NetworkEndBlackoutImage" BlackoutSlateProperty = InputLocationProperty
set :: PropertyType "NetworkEndBlackoutImage" BlackoutSlateProperty
-> BlackoutSlateProperty -> BlackoutSlateProperty
set PropertyType "NetworkEndBlackoutImage" BlackoutSlateProperty
newValue BlackoutSlateProperty {Maybe (Value Text)
Maybe InputLocationProperty
()
haddock_workaround_ :: BlackoutSlateProperty -> ()
blackoutSlateImage :: BlackoutSlateProperty -> Maybe InputLocationProperty
networkEndBlackout :: BlackoutSlateProperty -> Maybe (Value Text)
networkEndBlackoutImage :: BlackoutSlateProperty -> Maybe InputLocationProperty
networkId :: BlackoutSlateProperty -> Maybe (Value Text)
state :: BlackoutSlateProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blackoutSlateImage :: Maybe InputLocationProperty
networkEndBlackout :: Maybe (Value Text)
networkEndBlackoutImage :: Maybe InputLocationProperty
networkId :: Maybe (Value Text)
state :: Maybe (Value Text)
..}
= BlackoutSlateProperty
{networkEndBlackoutImage :: Maybe InputLocationProperty
networkEndBlackoutImage = InputLocationProperty -> Maybe InputLocationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "NetworkEndBlackoutImage" BlackoutSlateProperty
InputLocationProperty
newValue, Maybe (Value Text)
Maybe InputLocationProperty
()
haddock_workaround_ :: ()
blackoutSlateImage :: Maybe InputLocationProperty
networkEndBlackout :: Maybe (Value Text)
networkId :: Maybe (Value Text)
state :: Maybe (Value Text)
haddock_workaround_ :: ()
blackoutSlateImage :: Maybe InputLocationProperty
networkEndBlackout :: Maybe (Value Text)
networkId :: Maybe (Value Text)
state :: Maybe (Value Text)
..}
instance Property "NetworkId" BlackoutSlateProperty where
type PropertyType "NetworkId" BlackoutSlateProperty = Value Prelude.Text
set :: PropertyType "NetworkId" BlackoutSlateProperty
-> BlackoutSlateProperty -> BlackoutSlateProperty
set PropertyType "NetworkId" BlackoutSlateProperty
newValue BlackoutSlateProperty {Maybe (Value Text)
Maybe InputLocationProperty
()
haddock_workaround_ :: BlackoutSlateProperty -> ()
blackoutSlateImage :: BlackoutSlateProperty -> Maybe InputLocationProperty
networkEndBlackout :: BlackoutSlateProperty -> Maybe (Value Text)
networkEndBlackoutImage :: BlackoutSlateProperty -> Maybe InputLocationProperty
networkId :: BlackoutSlateProperty -> Maybe (Value Text)
state :: BlackoutSlateProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blackoutSlateImage :: Maybe InputLocationProperty
networkEndBlackout :: Maybe (Value Text)
networkEndBlackoutImage :: Maybe InputLocationProperty
networkId :: Maybe (Value Text)
state :: Maybe (Value Text)
..}
= BlackoutSlateProperty {networkId :: Maybe (Value Text)
networkId = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "NetworkId" BlackoutSlateProperty
Value Text
newValue, Maybe (Value Text)
Maybe InputLocationProperty
()
haddock_workaround_ :: ()
blackoutSlateImage :: Maybe InputLocationProperty
networkEndBlackout :: Maybe (Value Text)
networkEndBlackoutImage :: Maybe InputLocationProperty
state :: Maybe (Value Text)
haddock_workaround_ :: ()
blackoutSlateImage :: Maybe InputLocationProperty
networkEndBlackout :: Maybe (Value Text)
networkEndBlackoutImage :: Maybe InputLocationProperty
state :: Maybe (Value Text)
..}
instance Property "State" BlackoutSlateProperty where
type PropertyType "State" BlackoutSlateProperty = Value Prelude.Text
set :: PropertyType "State" BlackoutSlateProperty
-> BlackoutSlateProperty -> BlackoutSlateProperty
set PropertyType "State" BlackoutSlateProperty
newValue BlackoutSlateProperty {Maybe (Value Text)
Maybe InputLocationProperty
()
haddock_workaround_ :: BlackoutSlateProperty -> ()
blackoutSlateImage :: BlackoutSlateProperty -> Maybe InputLocationProperty
networkEndBlackout :: BlackoutSlateProperty -> Maybe (Value Text)
networkEndBlackoutImage :: BlackoutSlateProperty -> Maybe InputLocationProperty
networkId :: BlackoutSlateProperty -> Maybe (Value Text)
state :: BlackoutSlateProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blackoutSlateImage :: Maybe InputLocationProperty
networkEndBlackout :: Maybe (Value Text)
networkEndBlackoutImage :: Maybe InputLocationProperty
networkId :: Maybe (Value Text)
state :: Maybe (Value Text)
..}
= BlackoutSlateProperty {state :: Maybe (Value Text)
state = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "State" BlackoutSlateProperty
Value Text
newValue, Maybe (Value Text)
Maybe InputLocationProperty
()
haddock_workaround_ :: ()
blackoutSlateImage :: Maybe InputLocationProperty
networkEndBlackout :: Maybe (Value Text)
networkEndBlackoutImage :: Maybe InputLocationProperty
networkId :: Maybe (Value Text)
haddock_workaround_ :: ()
blackoutSlateImage :: Maybe InputLocationProperty
networkEndBlackout :: Maybe (Value Text)
networkEndBlackoutImage :: Maybe InputLocationProperty
networkId :: Maybe (Value Text)
..}