module Stratosphere.MediaPackage.PackagingConfiguration.DashManifestProperty (
module Exports, DashManifestProperty(..), mkDashManifestProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.MediaPackage.PackagingConfiguration.StreamSelectionProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data DashManifestProperty
=
DashManifestProperty {DashManifestProperty -> ()
haddock_workaround_ :: (),
DashManifestProperty -> Maybe (Value Text)
manifestLayout :: (Prelude.Maybe (Value Prelude.Text)),
DashManifestProperty -> Maybe (Value Text)
manifestName :: (Prelude.Maybe (Value Prelude.Text)),
DashManifestProperty -> Maybe (Value Integer)
minBufferTimeSeconds :: (Prelude.Maybe (Value Prelude.Integer)),
DashManifestProperty -> Maybe (Value Text)
profile :: (Prelude.Maybe (Value Prelude.Text)),
:: (Prelude.Maybe (Value Prelude.Text)),
DashManifestProperty -> Maybe StreamSelectionProperty
streamSelection :: (Prelude.Maybe StreamSelectionProperty)}
deriving stock (DashManifestProperty -> DashManifestProperty -> Bool
(DashManifestProperty -> DashManifestProperty -> Bool)
-> (DashManifestProperty -> DashManifestProperty -> Bool)
-> Eq DashManifestProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: DashManifestProperty -> DashManifestProperty -> Bool
== :: DashManifestProperty -> DashManifestProperty -> Bool
$c/= :: DashManifestProperty -> DashManifestProperty -> Bool
/= :: DashManifestProperty -> DashManifestProperty -> Bool
Prelude.Eq, Int -> DashManifestProperty -> ShowS
[DashManifestProperty] -> ShowS
DashManifestProperty -> String
(Int -> DashManifestProperty -> ShowS)
-> (DashManifestProperty -> String)
-> ([DashManifestProperty] -> ShowS)
-> Show DashManifestProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> DashManifestProperty -> ShowS
showsPrec :: Int -> DashManifestProperty -> ShowS
$cshow :: DashManifestProperty -> String
show :: DashManifestProperty -> String
$cshowList :: [DashManifestProperty] -> ShowS
showList :: [DashManifestProperty] -> ShowS
Prelude.Show)
mkDashManifestProperty :: DashManifestProperty
mkDashManifestProperty :: DashManifestProperty
mkDashManifestProperty
= DashManifestProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), manifestLayout :: Maybe (Value Text)
manifestLayout = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
manifestName :: Maybe (Value Text)
manifestName = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
minBufferTimeSeconds :: Maybe (Value Integer)
minBufferTimeSeconds = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing, profile :: Maybe (Value Text)
profile = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
scteMarkersSource :: Maybe (Value Text)
scteMarkersSource = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
streamSelection :: Maybe StreamSelectionProperty
streamSelection = Maybe StreamSelectionProperty
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties DashManifestProperty where
toResourceProperties :: DashManifestProperty -> ResourceProperties
toResourceProperties DashManifestProperty {Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamSelectionProperty
()
haddock_workaround_ :: DashManifestProperty -> ()
manifestLayout :: DashManifestProperty -> Maybe (Value Text)
manifestName :: DashManifestProperty -> Maybe (Value Text)
minBufferTimeSeconds :: DashManifestProperty -> Maybe (Value Integer)
profile :: DashManifestProperty -> Maybe (Value Text)
scteMarkersSource :: DashManifestProperty -> Maybe (Value Text)
streamSelection :: DashManifestProperty -> Maybe StreamSelectionProperty
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
manifestName :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
profile :: Maybe (Value Text)
scteMarkersSource :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::MediaPackage::PackagingConfiguration.DashManifest",
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 -> 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
"ManifestLayout" (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)
manifestLayout,
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
"ManifestName" (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)
manifestName,
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MinBufferTimeSeconds" (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
minBufferTimeSeconds,
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
"Profile" (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)
profile,
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
"ScteMarkersSource" (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)
scteMarkersSource,
Key -> StreamSelectionProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"StreamSelection" (StreamSelectionProperty -> (Key, Value))
-> Maybe StreamSelectionProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe StreamSelectionProperty
streamSelection])}
instance JSON.ToJSON DashManifestProperty where
toJSON :: DashManifestProperty -> Value
toJSON DashManifestProperty {Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamSelectionProperty
()
haddock_workaround_ :: DashManifestProperty -> ()
manifestLayout :: DashManifestProperty -> Maybe (Value Text)
manifestName :: DashManifestProperty -> Maybe (Value Text)
minBufferTimeSeconds :: DashManifestProperty -> Maybe (Value Integer)
profile :: DashManifestProperty -> Maybe (Value Text)
scteMarkersSource :: DashManifestProperty -> Maybe (Value Text)
streamSelection :: DashManifestProperty -> Maybe StreamSelectionProperty
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
manifestName :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
profile :: Maybe (Value Text)
scteMarkersSource :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
..}
= [(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 -> 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
"ManifestLayout" (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)
manifestLayout,
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
"ManifestName" (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)
manifestName,
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MinBufferTimeSeconds" (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
minBufferTimeSeconds,
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
"Profile" (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)
profile,
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
"ScteMarkersSource" (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)
scteMarkersSource,
Key -> StreamSelectionProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"StreamSelection" (StreamSelectionProperty -> (Key, Value))
-> Maybe StreamSelectionProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe StreamSelectionProperty
streamSelection]))
instance Property "ManifestLayout" DashManifestProperty where
type PropertyType "ManifestLayout" DashManifestProperty = Value Prelude.Text
set :: PropertyType "ManifestLayout" DashManifestProperty
-> DashManifestProperty -> DashManifestProperty
set PropertyType "ManifestLayout" DashManifestProperty
newValue DashManifestProperty {Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamSelectionProperty
()
haddock_workaround_ :: DashManifestProperty -> ()
manifestLayout :: DashManifestProperty -> Maybe (Value Text)
manifestName :: DashManifestProperty -> Maybe (Value Text)
minBufferTimeSeconds :: DashManifestProperty -> Maybe (Value Integer)
profile :: DashManifestProperty -> Maybe (Value Text)
scteMarkersSource :: DashManifestProperty -> Maybe (Value Text)
streamSelection :: DashManifestProperty -> Maybe StreamSelectionProperty
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
manifestName :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
profile :: Maybe (Value Text)
scteMarkersSource :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
..}
= DashManifestProperty {manifestLayout :: Maybe (Value Text)
manifestLayout = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ManifestLayout" DashManifestProperty
Value Text
newValue, Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamSelectionProperty
()
haddock_workaround_ :: ()
manifestName :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
profile :: Maybe (Value Text)
scteMarkersSource :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
haddock_workaround_ :: ()
manifestName :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
profile :: Maybe (Value Text)
scteMarkersSource :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
..}
instance Property "ManifestName" DashManifestProperty where
type PropertyType "ManifestName" DashManifestProperty = Value Prelude.Text
set :: PropertyType "ManifestName" DashManifestProperty
-> DashManifestProperty -> DashManifestProperty
set PropertyType "ManifestName" DashManifestProperty
newValue DashManifestProperty {Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamSelectionProperty
()
haddock_workaround_ :: DashManifestProperty -> ()
manifestLayout :: DashManifestProperty -> Maybe (Value Text)
manifestName :: DashManifestProperty -> Maybe (Value Text)
minBufferTimeSeconds :: DashManifestProperty -> Maybe (Value Integer)
profile :: DashManifestProperty -> Maybe (Value Text)
scteMarkersSource :: DashManifestProperty -> Maybe (Value Text)
streamSelection :: DashManifestProperty -> Maybe StreamSelectionProperty
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
manifestName :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
profile :: Maybe (Value Text)
scteMarkersSource :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
..}
= DashManifestProperty {manifestName :: Maybe (Value Text)
manifestName = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ManifestName" DashManifestProperty
Value Text
newValue, Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamSelectionProperty
()
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
profile :: Maybe (Value Text)
scteMarkersSource :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
profile :: Maybe (Value Text)
scteMarkersSource :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
..}
instance Property "MinBufferTimeSeconds" DashManifestProperty where
type PropertyType "MinBufferTimeSeconds" DashManifestProperty = Value Prelude.Integer
set :: PropertyType "MinBufferTimeSeconds" DashManifestProperty
-> DashManifestProperty -> DashManifestProperty
set PropertyType "MinBufferTimeSeconds" DashManifestProperty
newValue DashManifestProperty {Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamSelectionProperty
()
haddock_workaround_ :: DashManifestProperty -> ()
manifestLayout :: DashManifestProperty -> Maybe (Value Text)
manifestName :: DashManifestProperty -> Maybe (Value Text)
minBufferTimeSeconds :: DashManifestProperty -> Maybe (Value Integer)
profile :: DashManifestProperty -> Maybe (Value Text)
scteMarkersSource :: DashManifestProperty -> Maybe (Value Text)
streamSelection :: DashManifestProperty -> Maybe StreamSelectionProperty
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
manifestName :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
profile :: Maybe (Value Text)
scteMarkersSource :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
..}
= DashManifestProperty
{minBufferTimeSeconds :: Maybe (Value Integer)
minBufferTimeSeconds = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "MinBufferTimeSeconds" DashManifestProperty
Value Integer
newValue, Maybe (Value Text)
Maybe StreamSelectionProperty
()
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
manifestName :: Maybe (Value Text)
profile :: Maybe (Value Text)
scteMarkersSource :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
manifestName :: Maybe (Value Text)
profile :: Maybe (Value Text)
scteMarkersSource :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
..}
instance Property "Profile" DashManifestProperty where
type PropertyType "Profile" DashManifestProperty = Value Prelude.Text
set :: PropertyType "Profile" DashManifestProperty
-> DashManifestProperty -> DashManifestProperty
set PropertyType "Profile" DashManifestProperty
newValue DashManifestProperty {Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamSelectionProperty
()
haddock_workaround_ :: DashManifestProperty -> ()
manifestLayout :: DashManifestProperty -> Maybe (Value Text)
manifestName :: DashManifestProperty -> Maybe (Value Text)
minBufferTimeSeconds :: DashManifestProperty -> Maybe (Value Integer)
profile :: DashManifestProperty -> Maybe (Value Text)
scteMarkersSource :: DashManifestProperty -> Maybe (Value Text)
streamSelection :: DashManifestProperty -> Maybe StreamSelectionProperty
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
manifestName :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
profile :: Maybe (Value Text)
scteMarkersSource :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
..}
= DashManifestProperty {profile :: Maybe (Value Text)
profile = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Profile" DashManifestProperty
Value Text
newValue, Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamSelectionProperty
()
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
manifestName :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
scteMarkersSource :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
manifestName :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
scteMarkersSource :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
..}
instance Property "ScteMarkersSource" DashManifestProperty where
type PropertyType "ScteMarkersSource" DashManifestProperty = Value Prelude.Text
set :: PropertyType "ScteMarkersSource" DashManifestProperty
-> DashManifestProperty -> DashManifestProperty
set PropertyType "ScteMarkersSource" DashManifestProperty
newValue DashManifestProperty {Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamSelectionProperty
()
haddock_workaround_ :: DashManifestProperty -> ()
manifestLayout :: DashManifestProperty -> Maybe (Value Text)
manifestName :: DashManifestProperty -> Maybe (Value Text)
minBufferTimeSeconds :: DashManifestProperty -> Maybe (Value Integer)
profile :: DashManifestProperty -> Maybe (Value Text)
scteMarkersSource :: DashManifestProperty -> Maybe (Value Text)
streamSelection :: DashManifestProperty -> Maybe StreamSelectionProperty
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
manifestName :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
profile :: Maybe (Value Text)
scteMarkersSource :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
..}
= DashManifestProperty
{scteMarkersSource :: Maybe (Value Text)
scteMarkersSource = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ScteMarkersSource" DashManifestProperty
Value Text
newValue, Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamSelectionProperty
()
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
manifestName :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
profile :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
manifestName :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
profile :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
..}
instance Property "StreamSelection" DashManifestProperty where
type PropertyType "StreamSelection" DashManifestProperty = StreamSelectionProperty
set :: PropertyType "StreamSelection" DashManifestProperty
-> DashManifestProperty -> DashManifestProperty
set PropertyType "StreamSelection" DashManifestProperty
newValue DashManifestProperty {Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamSelectionProperty
()
haddock_workaround_ :: DashManifestProperty -> ()
manifestLayout :: DashManifestProperty -> Maybe (Value Text)
manifestName :: DashManifestProperty -> Maybe (Value Text)
minBufferTimeSeconds :: DashManifestProperty -> Maybe (Value Integer)
profile :: DashManifestProperty -> Maybe (Value Text)
scteMarkersSource :: DashManifestProperty -> Maybe (Value Text)
streamSelection :: DashManifestProperty -> Maybe StreamSelectionProperty
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
manifestName :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
profile :: Maybe (Value Text)
scteMarkersSource :: Maybe (Value Text)
streamSelection :: Maybe StreamSelectionProperty
..}
= DashManifestProperty
{streamSelection :: Maybe StreamSelectionProperty
streamSelection = StreamSelectionProperty -> Maybe StreamSelectionProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "StreamSelection" DashManifestProperty
StreamSelectionProperty
newValue, Maybe (Value Integer)
Maybe (Value Text)
()
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
manifestName :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
profile :: Maybe (Value Text)
scteMarkersSource :: Maybe (Value Text)
haddock_workaround_ :: ()
manifestLayout :: Maybe (Value Text)
manifestName :: Maybe (Value Text)
minBufferTimeSeconds :: Maybe (Value Integer)
profile :: Maybe (Value Text)
scteMarkersSource :: Maybe (Value Text)
..}