module Stratosphere.MediaConnect.BridgeOutput (
module Exports, BridgeOutput(..), mkBridgeOutput
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.MediaConnect.BridgeOutput.BridgeNetworkOutputProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data BridgeOutput
=
BridgeOutput {BridgeOutput -> ()
haddock_workaround_ :: (),
BridgeOutput -> Value Text
bridgeArn :: (Value Prelude.Text),
BridgeOutput -> Value Text
name :: (Value Prelude.Text),
BridgeOutput -> BridgeNetworkOutputProperty
networkOutput :: BridgeNetworkOutputProperty}
deriving stock (BridgeOutput -> BridgeOutput -> Bool
(BridgeOutput -> BridgeOutput -> Bool)
-> (BridgeOutput -> BridgeOutput -> Bool) -> Eq BridgeOutput
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: BridgeOutput -> BridgeOutput -> Bool
== :: BridgeOutput -> BridgeOutput -> Bool
$c/= :: BridgeOutput -> BridgeOutput -> Bool
/= :: BridgeOutput -> BridgeOutput -> Bool
Prelude.Eq, Int -> BridgeOutput -> ShowS
[BridgeOutput] -> ShowS
BridgeOutput -> String
(Int -> BridgeOutput -> ShowS)
-> (BridgeOutput -> String)
-> ([BridgeOutput] -> ShowS)
-> Show BridgeOutput
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> BridgeOutput -> ShowS
showsPrec :: Int -> BridgeOutput -> ShowS
$cshow :: BridgeOutput -> String
show :: BridgeOutput -> String
$cshowList :: [BridgeOutput] -> ShowS
showList :: [BridgeOutput] -> ShowS
Prelude.Show)
mkBridgeOutput ::
Value Prelude.Text
-> Value Prelude.Text
-> BridgeNetworkOutputProperty -> BridgeOutput
mkBridgeOutput :: Value Text
-> Value Text -> BridgeNetworkOutputProperty -> BridgeOutput
mkBridgeOutput Value Text
bridgeArn Value Text
name BridgeNetworkOutputProperty
networkOutput
= BridgeOutput
{haddock_workaround_ :: ()
haddock_workaround_ = (), bridgeArn :: Value Text
bridgeArn = Value Text
bridgeArn, name :: Value Text
name = Value Text
name,
networkOutput :: BridgeNetworkOutputProperty
networkOutput = BridgeNetworkOutputProperty
networkOutput}
instance ToResourceProperties BridgeOutput where
toResourceProperties :: BridgeOutput -> ResourceProperties
toResourceProperties BridgeOutput {()
Value Text
BridgeNetworkOutputProperty
haddock_workaround_ :: BridgeOutput -> ()
bridgeArn :: BridgeOutput -> Value Text
name :: BridgeOutput -> Value Text
networkOutput :: BridgeOutput -> BridgeNetworkOutputProperty
haddock_workaround_ :: ()
bridgeArn :: Value Text
name :: Value Text
networkOutput :: BridgeNetworkOutputProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::MediaConnect::BridgeOutput",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"BridgeArn" 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..= Value Text
bridgeArn, Key
"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..= Value Text
name,
Key
"NetworkOutput" Key -> BridgeNetworkOutputProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= BridgeNetworkOutputProperty
networkOutput]}
instance JSON.ToJSON BridgeOutput where
toJSON :: BridgeOutput -> Value
toJSON BridgeOutput {()
Value Text
BridgeNetworkOutputProperty
haddock_workaround_ :: BridgeOutput -> ()
bridgeArn :: BridgeOutput -> Value Text
name :: BridgeOutput -> Value Text
networkOutput :: BridgeOutput -> BridgeNetworkOutputProperty
haddock_workaround_ :: ()
bridgeArn :: Value Text
name :: Value Text
networkOutput :: BridgeNetworkOutputProperty
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"BridgeArn" 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..= Value Text
bridgeArn, Key
"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..= Value Text
name,
Key
"NetworkOutput" Key -> BridgeNetworkOutputProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= BridgeNetworkOutputProperty
networkOutput]
instance Property "BridgeArn" BridgeOutput where
type PropertyType "BridgeArn" BridgeOutput = Value Prelude.Text
set :: PropertyType "BridgeArn" BridgeOutput
-> BridgeOutput -> BridgeOutput
set PropertyType "BridgeArn" BridgeOutput
newValue BridgeOutput {()
Value Text
BridgeNetworkOutputProperty
haddock_workaround_ :: BridgeOutput -> ()
bridgeArn :: BridgeOutput -> Value Text
name :: BridgeOutput -> Value Text
networkOutput :: BridgeOutput -> BridgeNetworkOutputProperty
haddock_workaround_ :: ()
bridgeArn :: Value Text
name :: Value Text
networkOutput :: BridgeNetworkOutputProperty
..}
= BridgeOutput {bridgeArn :: Value Text
bridgeArn = PropertyType "BridgeArn" BridgeOutput
Value Text
newValue, ()
Value Text
BridgeNetworkOutputProperty
haddock_workaround_ :: ()
name :: Value Text
networkOutput :: BridgeNetworkOutputProperty
haddock_workaround_ :: ()
name :: Value Text
networkOutput :: BridgeNetworkOutputProperty
..}
instance Property "Name" BridgeOutput where
type PropertyType "Name" BridgeOutput = Value Prelude.Text
set :: PropertyType "Name" BridgeOutput -> BridgeOutput -> BridgeOutput
set PropertyType "Name" BridgeOutput
newValue BridgeOutput {()
Value Text
BridgeNetworkOutputProperty
haddock_workaround_ :: BridgeOutput -> ()
bridgeArn :: BridgeOutput -> Value Text
name :: BridgeOutput -> Value Text
networkOutput :: BridgeOutput -> BridgeNetworkOutputProperty
haddock_workaround_ :: ()
bridgeArn :: Value Text
name :: Value Text
networkOutput :: BridgeNetworkOutputProperty
..} = BridgeOutput {name :: Value Text
name = PropertyType "Name" BridgeOutput
Value Text
newValue, ()
Value Text
BridgeNetworkOutputProperty
haddock_workaround_ :: ()
bridgeArn :: Value Text
networkOutput :: BridgeNetworkOutputProperty
haddock_workaround_ :: ()
bridgeArn :: Value Text
networkOutput :: BridgeNetworkOutputProperty
..}
instance Property "NetworkOutput" BridgeOutput where
type PropertyType "NetworkOutput" BridgeOutput = BridgeNetworkOutputProperty
set :: PropertyType "NetworkOutput" BridgeOutput
-> BridgeOutput -> BridgeOutput
set PropertyType "NetworkOutput" BridgeOutput
newValue BridgeOutput {()
Value Text
BridgeNetworkOutputProperty
haddock_workaround_ :: BridgeOutput -> ()
bridgeArn :: BridgeOutput -> Value Text
name :: BridgeOutput -> Value Text
networkOutput :: BridgeOutput -> BridgeNetworkOutputProperty
haddock_workaround_ :: ()
bridgeArn :: Value Text
name :: Value Text
networkOutput :: BridgeNetworkOutputProperty
..}
= BridgeOutput {networkOutput :: BridgeNetworkOutputProperty
networkOutput = PropertyType "NetworkOutput" BridgeOutput
BridgeNetworkOutputProperty
newValue, ()
Value Text
haddock_workaround_ :: ()
bridgeArn :: Value Text
name :: Value Text
haddock_workaround_ :: ()
bridgeArn :: Value Text
name :: Value Text
..}