{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}
module Amazonka.MediaLive.Types.H264Settings where
import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.MediaLive.Types.AfdSignaling
import Amazonka.MediaLive.Types.FixedAfd
import Amazonka.MediaLive.Types.H264AdaptiveQuantization
import Amazonka.MediaLive.Types.H264ColorMetadata
import Amazonka.MediaLive.Types.H264ColorSpaceSettings
import Amazonka.MediaLive.Types.H264EntropyEncoding
import Amazonka.MediaLive.Types.H264FilterSettings
import Amazonka.MediaLive.Types.H264FlickerAq
import Amazonka.MediaLive.Types.H264ForceFieldPictures
import Amazonka.MediaLive.Types.H264FramerateControl
import Amazonka.MediaLive.Types.H264GopBReference
import Amazonka.MediaLive.Types.H264GopSizeUnits
import Amazonka.MediaLive.Types.H264Level
import Amazonka.MediaLive.Types.H264LookAheadRateControl
import Amazonka.MediaLive.Types.H264ParControl
import Amazonka.MediaLive.Types.H264Profile
import Amazonka.MediaLive.Types.H264QualityLevel
import Amazonka.MediaLive.Types.H264RateControlMode
import Amazonka.MediaLive.Types.H264ScanType
import Amazonka.MediaLive.Types.H264SceneChangeDetect
import Amazonka.MediaLive.Types.H264SpatialAq
import Amazonka.MediaLive.Types.H264SubGopLength
import Amazonka.MediaLive.Types.H264Syntax
import Amazonka.MediaLive.Types.H264TemporalAq
import Amazonka.MediaLive.Types.H264TimecodeInsertionBehavior
import Amazonka.MediaLive.Types.TimecodeBurninSettings
import qualified Amazonka.Prelude as Prelude
data H264Settings = H264Settings'
{
H264Settings -> Maybe H264AdaptiveQuantization
adaptiveQuantization :: Prelude.Maybe H264AdaptiveQuantization,
H264Settings -> Maybe AfdSignaling
afdSignaling :: Prelude.Maybe AfdSignaling,
H264Settings -> Maybe Natural
bitrate :: Prelude.Maybe Prelude.Natural,
H264Settings -> Maybe Natural
bufFillPct :: Prelude.Maybe Prelude.Natural,
H264Settings -> Maybe Natural
bufSize :: Prelude.Maybe Prelude.Natural,
H264Settings -> Maybe H264ColorMetadata
colorMetadata :: Prelude.Maybe H264ColorMetadata,
H264Settings -> Maybe H264ColorSpaceSettings
colorSpaceSettings :: Prelude.Maybe H264ColorSpaceSettings,
H264Settings -> Maybe H264EntropyEncoding
entropyEncoding :: Prelude.Maybe H264EntropyEncoding,
H264Settings -> Maybe H264FilterSettings
filterSettings :: Prelude.Maybe H264FilterSettings,
H264Settings -> Maybe FixedAfd
fixedAfd :: Prelude.Maybe FixedAfd,
H264Settings -> Maybe H264FlickerAq
flickerAq :: Prelude.Maybe H264FlickerAq,
H264Settings -> Maybe H264ForceFieldPictures
forceFieldPictures :: Prelude.Maybe H264ForceFieldPictures,
H264Settings -> Maybe H264FramerateControl
framerateControl :: Prelude.Maybe H264FramerateControl,
H264Settings -> Maybe Natural
framerateDenominator :: Prelude.Maybe Prelude.Natural,
H264Settings -> Maybe Natural
framerateNumerator :: Prelude.Maybe Prelude.Natural,
H264Settings -> Maybe H264GopBReference
gopBReference :: Prelude.Maybe H264GopBReference,
H264Settings -> Maybe Natural
gopClosedCadence :: Prelude.Maybe Prelude.Natural,
H264Settings -> Maybe Natural
gopNumBFrames :: Prelude.Maybe Prelude.Natural,
H264Settings -> Maybe Double
gopSize :: Prelude.Maybe Prelude.Double,
H264Settings -> Maybe H264GopSizeUnits
gopSizeUnits :: Prelude.Maybe H264GopSizeUnits,
H264Settings -> Maybe H264Level
level :: Prelude.Maybe H264Level,
H264Settings -> Maybe H264LookAheadRateControl
lookAheadRateControl :: Prelude.Maybe H264LookAheadRateControl,
H264Settings -> Maybe Natural
maxBitrate :: Prelude.Maybe Prelude.Natural,
H264Settings -> Maybe Natural
minIInterval :: Prelude.Maybe Prelude.Natural,
H264Settings -> Maybe Natural
numRefFrames :: Prelude.Maybe Prelude.Natural,
H264Settings -> Maybe H264ParControl
parControl :: Prelude.Maybe H264ParControl,
H264Settings -> Maybe Natural
parDenominator :: Prelude.Maybe Prelude.Natural,
H264Settings -> Maybe Natural
parNumerator :: Prelude.Maybe Prelude.Natural,
H264Settings -> Maybe H264Profile
profile :: Prelude.Maybe H264Profile,
H264Settings -> Maybe H264QualityLevel
qualityLevel :: Prelude.Maybe H264QualityLevel,
H264Settings -> Maybe Natural
qvbrQualityLevel :: Prelude.Maybe Prelude.Natural,
H264Settings -> Maybe H264RateControlMode
rateControlMode :: Prelude.Maybe H264RateControlMode,
H264Settings -> Maybe H264ScanType
scanType :: Prelude.Maybe H264ScanType,
H264Settings -> Maybe H264SceneChangeDetect
sceneChangeDetect :: Prelude.Maybe H264SceneChangeDetect,
H264Settings -> Maybe Natural
slices :: Prelude.Maybe Prelude.Natural,
H264Settings -> Maybe Natural
softness :: Prelude.Maybe Prelude.Natural,
H264Settings -> Maybe H264SpatialAq
spatialAq :: Prelude.Maybe H264SpatialAq,
H264Settings -> Maybe H264SubGopLength
subgopLength :: Prelude.Maybe H264SubGopLength,
H264Settings -> Maybe H264Syntax
syntax :: Prelude.Maybe H264Syntax,
H264Settings -> Maybe H264TemporalAq
temporalAq :: Prelude.Maybe H264TemporalAq,
H264Settings -> Maybe TimecodeBurninSettings
timecodeBurninSettings :: Prelude.Maybe TimecodeBurninSettings,
H264Settings -> Maybe H264TimecodeInsertionBehavior
timecodeInsertion :: Prelude.Maybe H264TimecodeInsertionBehavior
}
deriving (H264Settings -> H264Settings -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: H264Settings -> H264Settings -> Bool
$c/= :: H264Settings -> H264Settings -> Bool
== :: H264Settings -> H264Settings -> Bool
$c== :: H264Settings -> H264Settings -> Bool
Prelude.Eq, ReadPrec [H264Settings]
ReadPrec H264Settings
Int -> ReadS H264Settings
ReadS [H264Settings]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [H264Settings]
$creadListPrec :: ReadPrec [H264Settings]
readPrec :: ReadPrec H264Settings
$creadPrec :: ReadPrec H264Settings
readList :: ReadS [H264Settings]
$creadList :: ReadS [H264Settings]
readsPrec :: Int -> ReadS H264Settings
$creadsPrec :: Int -> ReadS H264Settings
Prelude.Read, Int -> H264Settings -> ShowS
[H264Settings] -> ShowS
H264Settings -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [H264Settings] -> ShowS
$cshowList :: [H264Settings] -> ShowS
show :: H264Settings -> String
$cshow :: H264Settings -> String
showsPrec :: Int -> H264Settings -> ShowS
$cshowsPrec :: Int -> H264Settings -> ShowS
Prelude.Show, forall x. Rep H264Settings x -> H264Settings
forall x. H264Settings -> Rep H264Settings x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep H264Settings x -> H264Settings
$cfrom :: forall x. H264Settings -> Rep H264Settings x
Prelude.Generic)
newH264Settings ::
H264Settings
newH264Settings :: H264Settings
newH264Settings =
H264Settings'
{ $sel:adaptiveQuantization:H264Settings' :: Maybe H264AdaptiveQuantization
adaptiveQuantization =
forall a. Maybe a
Prelude.Nothing,
$sel:afdSignaling:H264Settings' :: Maybe AfdSignaling
afdSignaling = forall a. Maybe a
Prelude.Nothing,
$sel:bitrate:H264Settings' :: Maybe Natural
bitrate = forall a. Maybe a
Prelude.Nothing,
$sel:bufFillPct:H264Settings' :: Maybe Natural
bufFillPct = forall a. Maybe a
Prelude.Nothing,
$sel:bufSize:H264Settings' :: Maybe Natural
bufSize = forall a. Maybe a
Prelude.Nothing,
$sel:colorMetadata:H264Settings' :: Maybe H264ColorMetadata
colorMetadata = forall a. Maybe a
Prelude.Nothing,
$sel:colorSpaceSettings:H264Settings' :: Maybe H264ColorSpaceSettings
colorSpaceSettings = forall a. Maybe a
Prelude.Nothing,
$sel:entropyEncoding:H264Settings' :: Maybe H264EntropyEncoding
entropyEncoding = forall a. Maybe a
Prelude.Nothing,
$sel:filterSettings:H264Settings' :: Maybe H264FilterSettings
filterSettings = forall a. Maybe a
Prelude.Nothing,
$sel:fixedAfd:H264Settings' :: Maybe FixedAfd
fixedAfd = forall a. Maybe a
Prelude.Nothing,
$sel:flickerAq:H264Settings' :: Maybe H264FlickerAq
flickerAq = forall a. Maybe a
Prelude.Nothing,
$sel:forceFieldPictures:H264Settings' :: Maybe H264ForceFieldPictures
forceFieldPictures = forall a. Maybe a
Prelude.Nothing,
$sel:framerateControl:H264Settings' :: Maybe H264FramerateControl
framerateControl = forall a. Maybe a
Prelude.Nothing,
$sel:framerateDenominator:H264Settings' :: Maybe Natural
framerateDenominator = forall a. Maybe a
Prelude.Nothing,
$sel:framerateNumerator:H264Settings' :: Maybe Natural
framerateNumerator = forall a. Maybe a
Prelude.Nothing,
$sel:gopBReference:H264Settings' :: Maybe H264GopBReference
gopBReference = forall a. Maybe a
Prelude.Nothing,
$sel:gopClosedCadence:H264Settings' :: Maybe Natural
gopClosedCadence = forall a. Maybe a
Prelude.Nothing,
$sel:gopNumBFrames:H264Settings' :: Maybe Natural
gopNumBFrames = forall a. Maybe a
Prelude.Nothing,
$sel:gopSize:H264Settings' :: Maybe Double
gopSize = forall a. Maybe a
Prelude.Nothing,
$sel:gopSizeUnits:H264Settings' :: Maybe H264GopSizeUnits
gopSizeUnits = forall a. Maybe a
Prelude.Nothing,
$sel:level:H264Settings' :: Maybe H264Level
level = forall a. Maybe a
Prelude.Nothing,
$sel:lookAheadRateControl:H264Settings' :: Maybe H264LookAheadRateControl
lookAheadRateControl = forall a. Maybe a
Prelude.Nothing,
$sel:maxBitrate:H264Settings' :: Maybe Natural
maxBitrate = forall a. Maybe a
Prelude.Nothing,
$sel:minIInterval:H264Settings' :: Maybe Natural
minIInterval = forall a. Maybe a
Prelude.Nothing,
$sel:numRefFrames:H264Settings' :: Maybe Natural
numRefFrames = forall a. Maybe a
Prelude.Nothing,
$sel:parControl:H264Settings' :: Maybe H264ParControl
parControl = forall a. Maybe a
Prelude.Nothing,
$sel:parDenominator:H264Settings' :: Maybe Natural
parDenominator = forall a. Maybe a
Prelude.Nothing,
$sel:parNumerator:H264Settings' :: Maybe Natural
parNumerator = forall a. Maybe a
Prelude.Nothing,
$sel:profile:H264Settings' :: Maybe H264Profile
profile = forall a. Maybe a
Prelude.Nothing,
$sel:qualityLevel:H264Settings' :: Maybe H264QualityLevel
qualityLevel = forall a. Maybe a
Prelude.Nothing,
$sel:qvbrQualityLevel:H264Settings' :: Maybe Natural
qvbrQualityLevel = forall a. Maybe a
Prelude.Nothing,
$sel:rateControlMode:H264Settings' :: Maybe H264RateControlMode
rateControlMode = forall a. Maybe a
Prelude.Nothing,
$sel:scanType:H264Settings' :: Maybe H264ScanType
scanType = forall a. Maybe a
Prelude.Nothing,
$sel:sceneChangeDetect:H264Settings' :: Maybe H264SceneChangeDetect
sceneChangeDetect = forall a. Maybe a
Prelude.Nothing,
$sel:slices:H264Settings' :: Maybe Natural
slices = forall a. Maybe a
Prelude.Nothing,
$sel:softness:H264Settings' :: Maybe Natural
softness = forall a. Maybe a
Prelude.Nothing,
$sel:spatialAq:H264Settings' :: Maybe H264SpatialAq
spatialAq = forall a. Maybe a
Prelude.Nothing,
$sel:subgopLength:H264Settings' :: Maybe H264SubGopLength
subgopLength = forall a. Maybe a
Prelude.Nothing,
$sel:syntax:H264Settings' :: Maybe H264Syntax
syntax = forall a. Maybe a
Prelude.Nothing,
$sel:temporalAq:H264Settings' :: Maybe H264TemporalAq
temporalAq = forall a. Maybe a
Prelude.Nothing,
$sel:timecodeBurninSettings:H264Settings' :: Maybe TimecodeBurninSettings
timecodeBurninSettings = forall a. Maybe a
Prelude.Nothing,
$sel:timecodeInsertion:H264Settings' :: Maybe H264TimecodeInsertionBehavior
timecodeInsertion = forall a. Maybe a
Prelude.Nothing
}
h264Settings_adaptiveQuantization :: Lens.Lens' H264Settings (Prelude.Maybe H264AdaptiveQuantization)
h264Settings_adaptiveQuantization :: Lens' H264Settings (Maybe H264AdaptiveQuantization)
h264Settings_adaptiveQuantization = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264AdaptiveQuantization
adaptiveQuantization :: Maybe H264AdaptiveQuantization
$sel:adaptiveQuantization:H264Settings' :: H264Settings -> Maybe H264AdaptiveQuantization
adaptiveQuantization} -> Maybe H264AdaptiveQuantization
adaptiveQuantization) (\s :: H264Settings
s@H264Settings' {} Maybe H264AdaptiveQuantization
a -> H264Settings
s {$sel:adaptiveQuantization:H264Settings' :: Maybe H264AdaptiveQuantization
adaptiveQuantization = Maybe H264AdaptiveQuantization
a} :: H264Settings)
h264Settings_afdSignaling :: Lens.Lens' H264Settings (Prelude.Maybe AfdSignaling)
h264Settings_afdSignaling :: Lens' H264Settings (Maybe AfdSignaling)
h264Settings_afdSignaling = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe AfdSignaling
afdSignaling :: Maybe AfdSignaling
$sel:afdSignaling:H264Settings' :: H264Settings -> Maybe AfdSignaling
afdSignaling} -> Maybe AfdSignaling
afdSignaling) (\s :: H264Settings
s@H264Settings' {} Maybe AfdSignaling
a -> H264Settings
s {$sel:afdSignaling:H264Settings' :: Maybe AfdSignaling
afdSignaling = Maybe AfdSignaling
a} :: H264Settings)
h264Settings_bitrate :: Lens.Lens' H264Settings (Prelude.Maybe Prelude.Natural)
h264Settings_bitrate :: Lens' H264Settings (Maybe Natural)
h264Settings_bitrate = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe Natural
bitrate :: Maybe Natural
$sel:bitrate:H264Settings' :: H264Settings -> Maybe Natural
bitrate} -> Maybe Natural
bitrate) (\s :: H264Settings
s@H264Settings' {} Maybe Natural
a -> H264Settings
s {$sel:bitrate:H264Settings' :: Maybe Natural
bitrate = Maybe Natural
a} :: H264Settings)
h264Settings_bufFillPct :: Lens.Lens' H264Settings (Prelude.Maybe Prelude.Natural)
h264Settings_bufFillPct :: Lens' H264Settings (Maybe Natural)
h264Settings_bufFillPct = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe Natural
bufFillPct :: Maybe Natural
$sel:bufFillPct:H264Settings' :: H264Settings -> Maybe Natural
bufFillPct} -> Maybe Natural
bufFillPct) (\s :: H264Settings
s@H264Settings' {} Maybe Natural
a -> H264Settings
s {$sel:bufFillPct:H264Settings' :: Maybe Natural
bufFillPct = Maybe Natural
a} :: H264Settings)
h264Settings_bufSize :: Lens.Lens' H264Settings (Prelude.Maybe Prelude.Natural)
h264Settings_bufSize :: Lens' H264Settings (Maybe Natural)
h264Settings_bufSize = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe Natural
bufSize :: Maybe Natural
$sel:bufSize:H264Settings' :: H264Settings -> Maybe Natural
bufSize} -> Maybe Natural
bufSize) (\s :: H264Settings
s@H264Settings' {} Maybe Natural
a -> H264Settings
s {$sel:bufSize:H264Settings' :: Maybe Natural
bufSize = Maybe Natural
a} :: H264Settings)
h264Settings_colorMetadata :: Lens.Lens' H264Settings (Prelude.Maybe H264ColorMetadata)
h264Settings_colorMetadata :: Lens' H264Settings (Maybe H264ColorMetadata)
h264Settings_colorMetadata = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264ColorMetadata
colorMetadata :: Maybe H264ColorMetadata
$sel:colorMetadata:H264Settings' :: H264Settings -> Maybe H264ColorMetadata
colorMetadata} -> Maybe H264ColorMetadata
colorMetadata) (\s :: H264Settings
s@H264Settings' {} Maybe H264ColorMetadata
a -> H264Settings
s {$sel:colorMetadata:H264Settings' :: Maybe H264ColorMetadata
colorMetadata = Maybe H264ColorMetadata
a} :: H264Settings)
h264Settings_colorSpaceSettings :: Lens.Lens' H264Settings (Prelude.Maybe H264ColorSpaceSettings)
h264Settings_colorSpaceSettings :: Lens' H264Settings (Maybe H264ColorSpaceSettings)
h264Settings_colorSpaceSettings = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264ColorSpaceSettings
colorSpaceSettings :: Maybe H264ColorSpaceSettings
$sel:colorSpaceSettings:H264Settings' :: H264Settings -> Maybe H264ColorSpaceSettings
colorSpaceSettings} -> Maybe H264ColorSpaceSettings
colorSpaceSettings) (\s :: H264Settings
s@H264Settings' {} Maybe H264ColorSpaceSettings
a -> H264Settings
s {$sel:colorSpaceSettings:H264Settings' :: Maybe H264ColorSpaceSettings
colorSpaceSettings = Maybe H264ColorSpaceSettings
a} :: H264Settings)
h264Settings_entropyEncoding :: Lens.Lens' H264Settings (Prelude.Maybe H264EntropyEncoding)
h264Settings_entropyEncoding :: Lens' H264Settings (Maybe H264EntropyEncoding)
h264Settings_entropyEncoding = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264EntropyEncoding
entropyEncoding :: Maybe H264EntropyEncoding
$sel:entropyEncoding:H264Settings' :: H264Settings -> Maybe H264EntropyEncoding
entropyEncoding} -> Maybe H264EntropyEncoding
entropyEncoding) (\s :: H264Settings
s@H264Settings' {} Maybe H264EntropyEncoding
a -> H264Settings
s {$sel:entropyEncoding:H264Settings' :: Maybe H264EntropyEncoding
entropyEncoding = Maybe H264EntropyEncoding
a} :: H264Settings)
h264Settings_filterSettings :: Lens.Lens' H264Settings (Prelude.Maybe H264FilterSettings)
h264Settings_filterSettings :: Lens' H264Settings (Maybe H264FilterSettings)
h264Settings_filterSettings = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264FilterSettings
filterSettings :: Maybe H264FilterSettings
$sel:filterSettings:H264Settings' :: H264Settings -> Maybe H264FilterSettings
filterSettings} -> Maybe H264FilterSettings
filterSettings) (\s :: H264Settings
s@H264Settings' {} Maybe H264FilterSettings
a -> H264Settings
s {$sel:filterSettings:H264Settings' :: Maybe H264FilterSettings
filterSettings = Maybe H264FilterSettings
a} :: H264Settings)
h264Settings_fixedAfd :: Lens.Lens' H264Settings (Prelude.Maybe FixedAfd)
h264Settings_fixedAfd :: Lens' H264Settings (Maybe FixedAfd)
h264Settings_fixedAfd = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe FixedAfd
fixedAfd :: Maybe FixedAfd
$sel:fixedAfd:H264Settings' :: H264Settings -> Maybe FixedAfd
fixedAfd} -> Maybe FixedAfd
fixedAfd) (\s :: H264Settings
s@H264Settings' {} Maybe FixedAfd
a -> H264Settings
s {$sel:fixedAfd:H264Settings' :: Maybe FixedAfd
fixedAfd = Maybe FixedAfd
a} :: H264Settings)
h264Settings_flickerAq :: Lens.Lens' H264Settings (Prelude.Maybe H264FlickerAq)
h264Settings_flickerAq :: Lens' H264Settings (Maybe H264FlickerAq)
h264Settings_flickerAq = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264FlickerAq
flickerAq :: Maybe H264FlickerAq
$sel:flickerAq:H264Settings' :: H264Settings -> Maybe H264FlickerAq
flickerAq} -> Maybe H264FlickerAq
flickerAq) (\s :: H264Settings
s@H264Settings' {} Maybe H264FlickerAq
a -> H264Settings
s {$sel:flickerAq:H264Settings' :: Maybe H264FlickerAq
flickerAq = Maybe H264FlickerAq
a} :: H264Settings)
h264Settings_forceFieldPictures :: Lens.Lens' H264Settings (Prelude.Maybe H264ForceFieldPictures)
h264Settings_forceFieldPictures :: Lens' H264Settings (Maybe H264ForceFieldPictures)
h264Settings_forceFieldPictures = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264ForceFieldPictures
forceFieldPictures :: Maybe H264ForceFieldPictures
$sel:forceFieldPictures:H264Settings' :: H264Settings -> Maybe H264ForceFieldPictures
forceFieldPictures} -> Maybe H264ForceFieldPictures
forceFieldPictures) (\s :: H264Settings
s@H264Settings' {} Maybe H264ForceFieldPictures
a -> H264Settings
s {$sel:forceFieldPictures:H264Settings' :: Maybe H264ForceFieldPictures
forceFieldPictures = Maybe H264ForceFieldPictures
a} :: H264Settings)
h264Settings_framerateControl :: Lens.Lens' H264Settings (Prelude.Maybe H264FramerateControl)
h264Settings_framerateControl :: Lens' H264Settings (Maybe H264FramerateControl)
h264Settings_framerateControl = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264FramerateControl
framerateControl :: Maybe H264FramerateControl
$sel:framerateControl:H264Settings' :: H264Settings -> Maybe H264FramerateControl
framerateControl} -> Maybe H264FramerateControl
framerateControl) (\s :: H264Settings
s@H264Settings' {} Maybe H264FramerateControl
a -> H264Settings
s {$sel:framerateControl:H264Settings' :: Maybe H264FramerateControl
framerateControl = Maybe H264FramerateControl
a} :: H264Settings)
h264Settings_framerateDenominator :: Lens.Lens' H264Settings (Prelude.Maybe Prelude.Natural)
h264Settings_framerateDenominator :: Lens' H264Settings (Maybe Natural)
h264Settings_framerateDenominator = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe Natural
framerateDenominator :: Maybe Natural
$sel:framerateDenominator:H264Settings' :: H264Settings -> Maybe Natural
framerateDenominator} -> Maybe Natural
framerateDenominator) (\s :: H264Settings
s@H264Settings' {} Maybe Natural
a -> H264Settings
s {$sel:framerateDenominator:H264Settings' :: Maybe Natural
framerateDenominator = Maybe Natural
a} :: H264Settings)
h264Settings_framerateNumerator :: Lens.Lens' H264Settings (Prelude.Maybe Prelude.Natural)
h264Settings_framerateNumerator :: Lens' H264Settings (Maybe Natural)
h264Settings_framerateNumerator = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe Natural
framerateNumerator :: Maybe Natural
$sel:framerateNumerator:H264Settings' :: H264Settings -> Maybe Natural
framerateNumerator} -> Maybe Natural
framerateNumerator) (\s :: H264Settings
s@H264Settings' {} Maybe Natural
a -> H264Settings
s {$sel:framerateNumerator:H264Settings' :: Maybe Natural
framerateNumerator = Maybe Natural
a} :: H264Settings)
h264Settings_gopBReference :: Lens.Lens' H264Settings (Prelude.Maybe H264GopBReference)
h264Settings_gopBReference :: Lens' H264Settings (Maybe H264GopBReference)
h264Settings_gopBReference = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264GopBReference
gopBReference :: Maybe H264GopBReference
$sel:gopBReference:H264Settings' :: H264Settings -> Maybe H264GopBReference
gopBReference} -> Maybe H264GopBReference
gopBReference) (\s :: H264Settings
s@H264Settings' {} Maybe H264GopBReference
a -> H264Settings
s {$sel:gopBReference:H264Settings' :: Maybe H264GopBReference
gopBReference = Maybe H264GopBReference
a} :: H264Settings)
h264Settings_gopClosedCadence :: Lens.Lens' H264Settings (Prelude.Maybe Prelude.Natural)
h264Settings_gopClosedCadence :: Lens' H264Settings (Maybe Natural)
h264Settings_gopClosedCadence = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe Natural
gopClosedCadence :: Maybe Natural
$sel:gopClosedCadence:H264Settings' :: H264Settings -> Maybe Natural
gopClosedCadence} -> Maybe Natural
gopClosedCadence) (\s :: H264Settings
s@H264Settings' {} Maybe Natural
a -> H264Settings
s {$sel:gopClosedCadence:H264Settings' :: Maybe Natural
gopClosedCadence = Maybe Natural
a} :: H264Settings)
h264Settings_gopNumBFrames :: Lens.Lens' H264Settings (Prelude.Maybe Prelude.Natural)
h264Settings_gopNumBFrames :: Lens' H264Settings (Maybe Natural)
h264Settings_gopNumBFrames = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe Natural
gopNumBFrames :: Maybe Natural
$sel:gopNumBFrames:H264Settings' :: H264Settings -> Maybe Natural
gopNumBFrames} -> Maybe Natural
gopNumBFrames) (\s :: H264Settings
s@H264Settings' {} Maybe Natural
a -> H264Settings
s {$sel:gopNumBFrames:H264Settings' :: Maybe Natural
gopNumBFrames = Maybe Natural
a} :: H264Settings)
h264Settings_gopSize :: Lens.Lens' H264Settings (Prelude.Maybe Prelude.Double)
h264Settings_gopSize :: Lens' H264Settings (Maybe Double)
h264Settings_gopSize = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe Double
gopSize :: Maybe Double
$sel:gopSize:H264Settings' :: H264Settings -> Maybe Double
gopSize} -> Maybe Double
gopSize) (\s :: H264Settings
s@H264Settings' {} Maybe Double
a -> H264Settings
s {$sel:gopSize:H264Settings' :: Maybe Double
gopSize = Maybe Double
a} :: H264Settings)
h264Settings_gopSizeUnits :: Lens.Lens' H264Settings (Prelude.Maybe H264GopSizeUnits)
h264Settings_gopSizeUnits :: Lens' H264Settings (Maybe H264GopSizeUnits)
h264Settings_gopSizeUnits = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264GopSizeUnits
gopSizeUnits :: Maybe H264GopSizeUnits
$sel:gopSizeUnits:H264Settings' :: H264Settings -> Maybe H264GopSizeUnits
gopSizeUnits} -> Maybe H264GopSizeUnits
gopSizeUnits) (\s :: H264Settings
s@H264Settings' {} Maybe H264GopSizeUnits
a -> H264Settings
s {$sel:gopSizeUnits:H264Settings' :: Maybe H264GopSizeUnits
gopSizeUnits = Maybe H264GopSizeUnits
a} :: H264Settings)
h264Settings_level :: Lens.Lens' H264Settings (Prelude.Maybe H264Level)
h264Settings_level :: Lens' H264Settings (Maybe H264Level)
h264Settings_level = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264Level
level :: Maybe H264Level
$sel:level:H264Settings' :: H264Settings -> Maybe H264Level
level} -> Maybe H264Level
level) (\s :: H264Settings
s@H264Settings' {} Maybe H264Level
a -> H264Settings
s {$sel:level:H264Settings' :: Maybe H264Level
level = Maybe H264Level
a} :: H264Settings)
h264Settings_lookAheadRateControl :: Lens.Lens' H264Settings (Prelude.Maybe H264LookAheadRateControl)
h264Settings_lookAheadRateControl :: Lens' H264Settings (Maybe H264LookAheadRateControl)
h264Settings_lookAheadRateControl = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264LookAheadRateControl
lookAheadRateControl :: Maybe H264LookAheadRateControl
$sel:lookAheadRateControl:H264Settings' :: H264Settings -> Maybe H264LookAheadRateControl
lookAheadRateControl} -> Maybe H264LookAheadRateControl
lookAheadRateControl) (\s :: H264Settings
s@H264Settings' {} Maybe H264LookAheadRateControl
a -> H264Settings
s {$sel:lookAheadRateControl:H264Settings' :: Maybe H264LookAheadRateControl
lookAheadRateControl = Maybe H264LookAheadRateControl
a} :: H264Settings)
h264Settings_maxBitrate :: Lens.Lens' H264Settings (Prelude.Maybe Prelude.Natural)
h264Settings_maxBitrate :: Lens' H264Settings (Maybe Natural)
h264Settings_maxBitrate = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe Natural
maxBitrate :: Maybe Natural
$sel:maxBitrate:H264Settings' :: H264Settings -> Maybe Natural
maxBitrate} -> Maybe Natural
maxBitrate) (\s :: H264Settings
s@H264Settings' {} Maybe Natural
a -> H264Settings
s {$sel:maxBitrate:H264Settings' :: Maybe Natural
maxBitrate = Maybe Natural
a} :: H264Settings)
h264Settings_minIInterval :: Lens.Lens' H264Settings (Prelude.Maybe Prelude.Natural)
h264Settings_minIInterval :: Lens' H264Settings (Maybe Natural)
h264Settings_minIInterval = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe Natural
minIInterval :: Maybe Natural
$sel:minIInterval:H264Settings' :: H264Settings -> Maybe Natural
minIInterval} -> Maybe Natural
minIInterval) (\s :: H264Settings
s@H264Settings' {} Maybe Natural
a -> H264Settings
s {$sel:minIInterval:H264Settings' :: Maybe Natural
minIInterval = Maybe Natural
a} :: H264Settings)
h264Settings_numRefFrames :: Lens.Lens' H264Settings (Prelude.Maybe Prelude.Natural)
h264Settings_numRefFrames :: Lens' H264Settings (Maybe Natural)
h264Settings_numRefFrames = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe Natural
numRefFrames :: Maybe Natural
$sel:numRefFrames:H264Settings' :: H264Settings -> Maybe Natural
numRefFrames} -> Maybe Natural
numRefFrames) (\s :: H264Settings
s@H264Settings' {} Maybe Natural
a -> H264Settings
s {$sel:numRefFrames:H264Settings' :: Maybe Natural
numRefFrames = Maybe Natural
a} :: H264Settings)
h264Settings_parControl :: Lens.Lens' H264Settings (Prelude.Maybe H264ParControl)
h264Settings_parControl :: Lens' H264Settings (Maybe H264ParControl)
h264Settings_parControl = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264ParControl
parControl :: Maybe H264ParControl
$sel:parControl:H264Settings' :: H264Settings -> Maybe H264ParControl
parControl} -> Maybe H264ParControl
parControl) (\s :: H264Settings
s@H264Settings' {} Maybe H264ParControl
a -> H264Settings
s {$sel:parControl:H264Settings' :: Maybe H264ParControl
parControl = Maybe H264ParControl
a} :: H264Settings)
h264Settings_parDenominator :: Lens.Lens' H264Settings (Prelude.Maybe Prelude.Natural)
h264Settings_parDenominator :: Lens' H264Settings (Maybe Natural)
h264Settings_parDenominator = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe Natural
parDenominator :: Maybe Natural
$sel:parDenominator:H264Settings' :: H264Settings -> Maybe Natural
parDenominator} -> Maybe Natural
parDenominator) (\s :: H264Settings
s@H264Settings' {} Maybe Natural
a -> H264Settings
s {$sel:parDenominator:H264Settings' :: Maybe Natural
parDenominator = Maybe Natural
a} :: H264Settings)
h264Settings_parNumerator :: Lens.Lens' H264Settings (Prelude.Maybe Prelude.Natural)
h264Settings_parNumerator :: Lens' H264Settings (Maybe Natural)
h264Settings_parNumerator = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe Natural
parNumerator :: Maybe Natural
$sel:parNumerator:H264Settings' :: H264Settings -> Maybe Natural
parNumerator} -> Maybe Natural
parNumerator) (\s :: H264Settings
s@H264Settings' {} Maybe Natural
a -> H264Settings
s {$sel:parNumerator:H264Settings' :: Maybe Natural
parNumerator = Maybe Natural
a} :: H264Settings)
h264Settings_profile :: Lens.Lens' H264Settings (Prelude.Maybe H264Profile)
h264Settings_profile :: Lens' H264Settings (Maybe H264Profile)
h264Settings_profile = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264Profile
profile :: Maybe H264Profile
$sel:profile:H264Settings' :: H264Settings -> Maybe H264Profile
profile} -> Maybe H264Profile
profile) (\s :: H264Settings
s@H264Settings' {} Maybe H264Profile
a -> H264Settings
s {$sel:profile:H264Settings' :: Maybe H264Profile
profile = Maybe H264Profile
a} :: H264Settings)
h264Settings_qualityLevel :: Lens.Lens' H264Settings (Prelude.Maybe H264QualityLevel)
h264Settings_qualityLevel :: Lens' H264Settings (Maybe H264QualityLevel)
h264Settings_qualityLevel = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264QualityLevel
qualityLevel :: Maybe H264QualityLevel
$sel:qualityLevel:H264Settings' :: H264Settings -> Maybe H264QualityLevel
qualityLevel} -> Maybe H264QualityLevel
qualityLevel) (\s :: H264Settings
s@H264Settings' {} Maybe H264QualityLevel
a -> H264Settings
s {$sel:qualityLevel:H264Settings' :: Maybe H264QualityLevel
qualityLevel = Maybe H264QualityLevel
a} :: H264Settings)
h264Settings_qvbrQualityLevel :: Lens.Lens' H264Settings (Prelude.Maybe Prelude.Natural)
h264Settings_qvbrQualityLevel :: Lens' H264Settings (Maybe Natural)
h264Settings_qvbrQualityLevel = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe Natural
qvbrQualityLevel :: Maybe Natural
$sel:qvbrQualityLevel:H264Settings' :: H264Settings -> Maybe Natural
qvbrQualityLevel} -> Maybe Natural
qvbrQualityLevel) (\s :: H264Settings
s@H264Settings' {} Maybe Natural
a -> H264Settings
s {$sel:qvbrQualityLevel:H264Settings' :: Maybe Natural
qvbrQualityLevel = Maybe Natural
a} :: H264Settings)
h264Settings_rateControlMode :: Lens.Lens' H264Settings (Prelude.Maybe H264RateControlMode)
h264Settings_rateControlMode :: Lens' H264Settings (Maybe H264RateControlMode)
h264Settings_rateControlMode = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264RateControlMode
rateControlMode :: Maybe H264RateControlMode
$sel:rateControlMode:H264Settings' :: H264Settings -> Maybe H264RateControlMode
rateControlMode} -> Maybe H264RateControlMode
rateControlMode) (\s :: H264Settings
s@H264Settings' {} Maybe H264RateControlMode
a -> H264Settings
s {$sel:rateControlMode:H264Settings' :: Maybe H264RateControlMode
rateControlMode = Maybe H264RateControlMode
a} :: H264Settings)
h264Settings_scanType :: Lens.Lens' H264Settings (Prelude.Maybe H264ScanType)
h264Settings_scanType :: Lens' H264Settings (Maybe H264ScanType)
h264Settings_scanType = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264ScanType
scanType :: Maybe H264ScanType
$sel:scanType:H264Settings' :: H264Settings -> Maybe H264ScanType
scanType} -> Maybe H264ScanType
scanType) (\s :: H264Settings
s@H264Settings' {} Maybe H264ScanType
a -> H264Settings
s {$sel:scanType:H264Settings' :: Maybe H264ScanType
scanType = Maybe H264ScanType
a} :: H264Settings)
h264Settings_sceneChangeDetect :: Lens.Lens' H264Settings (Prelude.Maybe H264SceneChangeDetect)
h264Settings_sceneChangeDetect :: Lens' H264Settings (Maybe H264SceneChangeDetect)
h264Settings_sceneChangeDetect = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264SceneChangeDetect
sceneChangeDetect :: Maybe H264SceneChangeDetect
$sel:sceneChangeDetect:H264Settings' :: H264Settings -> Maybe H264SceneChangeDetect
sceneChangeDetect} -> Maybe H264SceneChangeDetect
sceneChangeDetect) (\s :: H264Settings
s@H264Settings' {} Maybe H264SceneChangeDetect
a -> H264Settings
s {$sel:sceneChangeDetect:H264Settings' :: Maybe H264SceneChangeDetect
sceneChangeDetect = Maybe H264SceneChangeDetect
a} :: H264Settings)
h264Settings_slices :: Lens.Lens' H264Settings (Prelude.Maybe Prelude.Natural)
h264Settings_slices :: Lens' H264Settings (Maybe Natural)
h264Settings_slices = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe Natural
slices :: Maybe Natural
$sel:slices:H264Settings' :: H264Settings -> Maybe Natural
slices} -> Maybe Natural
slices) (\s :: H264Settings
s@H264Settings' {} Maybe Natural
a -> H264Settings
s {$sel:slices:H264Settings' :: Maybe Natural
slices = Maybe Natural
a} :: H264Settings)
h264Settings_softness :: Lens.Lens' H264Settings (Prelude.Maybe Prelude.Natural)
h264Settings_softness :: Lens' H264Settings (Maybe Natural)
h264Settings_softness = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe Natural
softness :: Maybe Natural
$sel:softness:H264Settings' :: H264Settings -> Maybe Natural
softness} -> Maybe Natural
softness) (\s :: H264Settings
s@H264Settings' {} Maybe Natural
a -> H264Settings
s {$sel:softness:H264Settings' :: Maybe Natural
softness = Maybe Natural
a} :: H264Settings)
h264Settings_spatialAq :: Lens.Lens' H264Settings (Prelude.Maybe H264SpatialAq)
h264Settings_spatialAq :: Lens' H264Settings (Maybe H264SpatialAq)
h264Settings_spatialAq = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264SpatialAq
spatialAq :: Maybe H264SpatialAq
$sel:spatialAq:H264Settings' :: H264Settings -> Maybe H264SpatialAq
spatialAq} -> Maybe H264SpatialAq
spatialAq) (\s :: H264Settings
s@H264Settings' {} Maybe H264SpatialAq
a -> H264Settings
s {$sel:spatialAq:H264Settings' :: Maybe H264SpatialAq
spatialAq = Maybe H264SpatialAq
a} :: H264Settings)
h264Settings_subgopLength :: Lens.Lens' H264Settings (Prelude.Maybe H264SubGopLength)
h264Settings_subgopLength :: Lens' H264Settings (Maybe H264SubGopLength)
h264Settings_subgopLength = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264SubGopLength
subgopLength :: Maybe H264SubGopLength
$sel:subgopLength:H264Settings' :: H264Settings -> Maybe H264SubGopLength
subgopLength} -> Maybe H264SubGopLength
subgopLength) (\s :: H264Settings
s@H264Settings' {} Maybe H264SubGopLength
a -> H264Settings
s {$sel:subgopLength:H264Settings' :: Maybe H264SubGopLength
subgopLength = Maybe H264SubGopLength
a} :: H264Settings)
h264Settings_syntax :: Lens.Lens' H264Settings (Prelude.Maybe H264Syntax)
h264Settings_syntax :: Lens' H264Settings (Maybe H264Syntax)
h264Settings_syntax = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264Syntax
syntax :: Maybe H264Syntax
$sel:syntax:H264Settings' :: H264Settings -> Maybe H264Syntax
syntax} -> Maybe H264Syntax
syntax) (\s :: H264Settings
s@H264Settings' {} Maybe H264Syntax
a -> H264Settings
s {$sel:syntax:H264Settings' :: Maybe H264Syntax
syntax = Maybe H264Syntax
a} :: H264Settings)
h264Settings_temporalAq :: Lens.Lens' H264Settings (Prelude.Maybe H264TemporalAq)
h264Settings_temporalAq :: Lens' H264Settings (Maybe H264TemporalAq)
h264Settings_temporalAq = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264TemporalAq
temporalAq :: Maybe H264TemporalAq
$sel:temporalAq:H264Settings' :: H264Settings -> Maybe H264TemporalAq
temporalAq} -> Maybe H264TemporalAq
temporalAq) (\s :: H264Settings
s@H264Settings' {} Maybe H264TemporalAq
a -> H264Settings
s {$sel:temporalAq:H264Settings' :: Maybe H264TemporalAq
temporalAq = Maybe H264TemporalAq
a} :: H264Settings)
h264Settings_timecodeBurninSettings :: Lens.Lens' H264Settings (Prelude.Maybe TimecodeBurninSettings)
h264Settings_timecodeBurninSettings :: Lens' H264Settings (Maybe TimecodeBurninSettings)
h264Settings_timecodeBurninSettings = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe TimecodeBurninSettings
timecodeBurninSettings :: Maybe TimecodeBurninSettings
$sel:timecodeBurninSettings:H264Settings' :: H264Settings -> Maybe TimecodeBurninSettings
timecodeBurninSettings} -> Maybe TimecodeBurninSettings
timecodeBurninSettings) (\s :: H264Settings
s@H264Settings' {} Maybe TimecodeBurninSettings
a -> H264Settings
s {$sel:timecodeBurninSettings:H264Settings' :: Maybe TimecodeBurninSettings
timecodeBurninSettings = Maybe TimecodeBurninSettings
a} :: H264Settings)
h264Settings_timecodeInsertion :: Lens.Lens' H264Settings (Prelude.Maybe H264TimecodeInsertionBehavior)
h264Settings_timecodeInsertion :: Lens' H264Settings (Maybe H264TimecodeInsertionBehavior)
h264Settings_timecodeInsertion = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\H264Settings' {Maybe H264TimecodeInsertionBehavior
timecodeInsertion :: Maybe H264TimecodeInsertionBehavior
$sel:timecodeInsertion:H264Settings' :: H264Settings -> Maybe H264TimecodeInsertionBehavior
timecodeInsertion} -> Maybe H264TimecodeInsertionBehavior
timecodeInsertion) (\s :: H264Settings
s@H264Settings' {} Maybe H264TimecodeInsertionBehavior
a -> H264Settings
s {$sel:timecodeInsertion:H264Settings' :: Maybe H264TimecodeInsertionBehavior
timecodeInsertion = Maybe H264TimecodeInsertionBehavior
a} :: H264Settings)
instance Data.FromJSON H264Settings where
parseJSON :: Value -> Parser H264Settings
parseJSON =
forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
String
"H264Settings"
( \Object
x ->
Maybe H264AdaptiveQuantization
-> Maybe AfdSignaling
-> Maybe Natural
-> Maybe Natural
-> Maybe Natural
-> Maybe H264ColorMetadata
-> Maybe H264ColorSpaceSettings
-> Maybe H264EntropyEncoding
-> Maybe H264FilterSettings
-> Maybe FixedAfd
-> Maybe H264FlickerAq
-> Maybe H264ForceFieldPictures
-> Maybe H264FramerateControl
-> Maybe Natural
-> Maybe Natural
-> Maybe H264GopBReference
-> Maybe Natural
-> Maybe Natural
-> Maybe Double
-> Maybe H264GopSizeUnits
-> Maybe H264Level
-> Maybe H264LookAheadRateControl
-> Maybe Natural
-> Maybe Natural
-> Maybe Natural
-> Maybe H264ParControl
-> Maybe Natural
-> Maybe Natural
-> Maybe H264Profile
-> Maybe H264QualityLevel
-> Maybe Natural
-> Maybe H264RateControlMode
-> Maybe H264ScanType
-> Maybe H264SceneChangeDetect
-> Maybe Natural
-> Maybe Natural
-> Maybe H264SpatialAq
-> Maybe H264SubGopLength
-> Maybe H264Syntax
-> Maybe H264TemporalAq
-> Maybe TimecodeBurninSettings
-> Maybe H264TimecodeInsertionBehavior
-> H264Settings
H264Settings'
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"adaptiveQuantization")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"afdSignaling")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"bitrate")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"bufFillPct")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"bufSize")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"colorMetadata")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"colorSpaceSettings")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"entropyEncoding")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"filterSettings")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"fixedAfd")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"flickerAq")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"forceFieldPictures")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"framerateControl")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"framerateDenominator")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"framerateNumerator")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"gopBReference")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"gopClosedCadence")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"gopNumBFrames")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"gopSize")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"gopSizeUnits")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"level")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"lookAheadRateControl")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"maxBitrate")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"minIInterval")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"numRefFrames")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"parControl")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"parDenominator")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"parNumerator")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"profile")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"qualityLevel")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"qvbrQualityLevel")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"rateControlMode")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"scanType")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"sceneChangeDetect")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"slices")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"softness")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"spatialAq")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"subgopLength")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"syntax")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"temporalAq")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"timecodeBurninSettings")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"timecodeInsertion")
)
instance Prelude.Hashable H264Settings where
hashWithSalt :: Int -> H264Settings -> Int
hashWithSalt Int
_salt H264Settings' {Maybe Double
Maybe Natural
Maybe AfdSignaling
Maybe FixedAfd
Maybe H264AdaptiveQuantization
Maybe H264ColorMetadata
Maybe H264EntropyEncoding
Maybe H264FlickerAq
Maybe H264ForceFieldPictures
Maybe H264FramerateControl
Maybe H264GopBReference
Maybe H264GopSizeUnits
Maybe H264Level
Maybe H264LookAheadRateControl
Maybe H264ParControl
Maybe H264Profile
Maybe H264QualityLevel
Maybe H264RateControlMode
Maybe H264ScanType
Maybe H264SceneChangeDetect
Maybe H264SpatialAq
Maybe H264SubGopLength
Maybe H264Syntax
Maybe H264TemporalAq
Maybe H264TimecodeInsertionBehavior
Maybe H264ColorSpaceSettings
Maybe H264FilterSettings
Maybe TimecodeBurninSettings
timecodeInsertion :: Maybe H264TimecodeInsertionBehavior
timecodeBurninSettings :: Maybe TimecodeBurninSettings
temporalAq :: Maybe H264TemporalAq
syntax :: Maybe H264Syntax
subgopLength :: Maybe H264SubGopLength
spatialAq :: Maybe H264SpatialAq
softness :: Maybe Natural
slices :: Maybe Natural
sceneChangeDetect :: Maybe H264SceneChangeDetect
scanType :: Maybe H264ScanType
rateControlMode :: Maybe H264RateControlMode
qvbrQualityLevel :: Maybe Natural
qualityLevel :: Maybe H264QualityLevel
profile :: Maybe H264Profile
parNumerator :: Maybe Natural
parDenominator :: Maybe Natural
parControl :: Maybe H264ParControl
numRefFrames :: Maybe Natural
minIInterval :: Maybe Natural
maxBitrate :: Maybe Natural
lookAheadRateControl :: Maybe H264LookAheadRateControl
level :: Maybe H264Level
gopSizeUnits :: Maybe H264GopSizeUnits
gopSize :: Maybe Double
gopNumBFrames :: Maybe Natural
gopClosedCadence :: Maybe Natural
gopBReference :: Maybe H264GopBReference
framerateNumerator :: Maybe Natural
framerateDenominator :: Maybe Natural
framerateControl :: Maybe H264FramerateControl
forceFieldPictures :: Maybe H264ForceFieldPictures
flickerAq :: Maybe H264FlickerAq
fixedAfd :: Maybe FixedAfd
filterSettings :: Maybe H264FilterSettings
entropyEncoding :: Maybe H264EntropyEncoding
colorSpaceSettings :: Maybe H264ColorSpaceSettings
colorMetadata :: Maybe H264ColorMetadata
bufSize :: Maybe Natural
bufFillPct :: Maybe Natural
bitrate :: Maybe Natural
afdSignaling :: Maybe AfdSignaling
adaptiveQuantization :: Maybe H264AdaptiveQuantization
$sel:timecodeInsertion:H264Settings' :: H264Settings -> Maybe H264TimecodeInsertionBehavior
$sel:timecodeBurninSettings:H264Settings' :: H264Settings -> Maybe TimecodeBurninSettings
$sel:temporalAq:H264Settings' :: H264Settings -> Maybe H264TemporalAq
$sel:syntax:H264Settings' :: H264Settings -> Maybe H264Syntax
$sel:subgopLength:H264Settings' :: H264Settings -> Maybe H264SubGopLength
$sel:spatialAq:H264Settings' :: H264Settings -> Maybe H264SpatialAq
$sel:softness:H264Settings' :: H264Settings -> Maybe Natural
$sel:slices:H264Settings' :: H264Settings -> Maybe Natural
$sel:sceneChangeDetect:H264Settings' :: H264Settings -> Maybe H264SceneChangeDetect
$sel:scanType:H264Settings' :: H264Settings -> Maybe H264ScanType
$sel:rateControlMode:H264Settings' :: H264Settings -> Maybe H264RateControlMode
$sel:qvbrQualityLevel:H264Settings' :: H264Settings -> Maybe Natural
$sel:qualityLevel:H264Settings' :: H264Settings -> Maybe H264QualityLevel
$sel:profile:H264Settings' :: H264Settings -> Maybe H264Profile
$sel:parNumerator:H264Settings' :: H264Settings -> Maybe Natural
$sel:parDenominator:H264Settings' :: H264Settings -> Maybe Natural
$sel:parControl:H264Settings' :: H264Settings -> Maybe H264ParControl
$sel:numRefFrames:H264Settings' :: H264Settings -> Maybe Natural
$sel:minIInterval:H264Settings' :: H264Settings -> Maybe Natural
$sel:maxBitrate:H264Settings' :: H264Settings -> Maybe Natural
$sel:lookAheadRateControl:H264Settings' :: H264Settings -> Maybe H264LookAheadRateControl
$sel:level:H264Settings' :: H264Settings -> Maybe H264Level
$sel:gopSizeUnits:H264Settings' :: H264Settings -> Maybe H264GopSizeUnits
$sel:gopSize:H264Settings' :: H264Settings -> Maybe Double
$sel:gopNumBFrames:H264Settings' :: H264Settings -> Maybe Natural
$sel:gopClosedCadence:H264Settings' :: H264Settings -> Maybe Natural
$sel:gopBReference:H264Settings' :: H264Settings -> Maybe H264GopBReference
$sel:framerateNumerator:H264Settings' :: H264Settings -> Maybe Natural
$sel:framerateDenominator:H264Settings' :: H264Settings -> Maybe Natural
$sel:framerateControl:H264Settings' :: H264Settings -> Maybe H264FramerateControl
$sel:forceFieldPictures:H264Settings' :: H264Settings -> Maybe H264ForceFieldPictures
$sel:flickerAq:H264Settings' :: H264Settings -> Maybe H264FlickerAq
$sel:fixedAfd:H264Settings' :: H264Settings -> Maybe FixedAfd
$sel:filterSettings:H264Settings' :: H264Settings -> Maybe H264FilterSettings
$sel:entropyEncoding:H264Settings' :: H264Settings -> Maybe H264EntropyEncoding
$sel:colorSpaceSettings:H264Settings' :: H264Settings -> Maybe H264ColorSpaceSettings
$sel:colorMetadata:H264Settings' :: H264Settings -> Maybe H264ColorMetadata
$sel:bufSize:H264Settings' :: H264Settings -> Maybe Natural
$sel:bufFillPct:H264Settings' :: H264Settings -> Maybe Natural
$sel:bitrate:H264Settings' :: H264Settings -> Maybe Natural
$sel:afdSignaling:H264Settings' :: H264Settings -> Maybe AfdSignaling
$sel:adaptiveQuantization:H264Settings' :: H264Settings -> Maybe H264AdaptiveQuantization
..} =
Int
_salt
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264AdaptiveQuantization
adaptiveQuantization
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe AfdSignaling
afdSignaling
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
bitrate
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
bufFillPct
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
bufSize
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264ColorMetadata
colorMetadata
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264ColorSpaceSettings
colorSpaceSettings
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264EntropyEncoding
entropyEncoding
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264FilterSettings
filterSettings
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe FixedAfd
fixedAfd
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264FlickerAq
flickerAq
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264ForceFieldPictures
forceFieldPictures
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264FramerateControl
framerateControl
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
framerateDenominator
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
framerateNumerator
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264GopBReference
gopBReference
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
gopClosedCadence
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
gopNumBFrames
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Double
gopSize
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264GopSizeUnits
gopSizeUnits
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264Level
level
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264LookAheadRateControl
lookAheadRateControl
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
maxBitrate
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
minIInterval
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
numRefFrames
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264ParControl
parControl
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
parDenominator
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
parNumerator
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264Profile
profile
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264QualityLevel
qualityLevel
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
qvbrQualityLevel
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264RateControlMode
rateControlMode
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264ScanType
scanType
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264SceneChangeDetect
sceneChangeDetect
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
slices
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
softness
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264SpatialAq
spatialAq
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264SubGopLength
subgopLength
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264Syntax
syntax
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264TemporalAq
temporalAq
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe TimecodeBurninSettings
timecodeBurninSettings
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe H264TimecodeInsertionBehavior
timecodeInsertion
instance Prelude.NFData H264Settings where
rnf :: H264Settings -> ()
rnf H264Settings' {Maybe Double
Maybe Natural
Maybe AfdSignaling
Maybe FixedAfd
Maybe H264AdaptiveQuantization
Maybe H264ColorMetadata
Maybe H264EntropyEncoding
Maybe H264FlickerAq
Maybe H264ForceFieldPictures
Maybe H264FramerateControl
Maybe H264GopBReference
Maybe H264GopSizeUnits
Maybe H264Level
Maybe H264LookAheadRateControl
Maybe H264ParControl
Maybe H264Profile
Maybe H264QualityLevel
Maybe H264RateControlMode
Maybe H264ScanType
Maybe H264SceneChangeDetect
Maybe H264SpatialAq
Maybe H264SubGopLength
Maybe H264Syntax
Maybe H264TemporalAq
Maybe H264TimecodeInsertionBehavior
Maybe H264ColorSpaceSettings
Maybe H264FilterSettings
Maybe TimecodeBurninSettings
timecodeInsertion :: Maybe H264TimecodeInsertionBehavior
timecodeBurninSettings :: Maybe TimecodeBurninSettings
temporalAq :: Maybe H264TemporalAq
syntax :: Maybe H264Syntax
subgopLength :: Maybe H264SubGopLength
spatialAq :: Maybe H264SpatialAq
softness :: Maybe Natural
slices :: Maybe Natural
sceneChangeDetect :: Maybe H264SceneChangeDetect
scanType :: Maybe H264ScanType
rateControlMode :: Maybe H264RateControlMode
qvbrQualityLevel :: Maybe Natural
qualityLevel :: Maybe H264QualityLevel
profile :: Maybe H264Profile
parNumerator :: Maybe Natural
parDenominator :: Maybe Natural
parControl :: Maybe H264ParControl
numRefFrames :: Maybe Natural
minIInterval :: Maybe Natural
maxBitrate :: Maybe Natural
lookAheadRateControl :: Maybe H264LookAheadRateControl
level :: Maybe H264Level
gopSizeUnits :: Maybe H264GopSizeUnits
gopSize :: Maybe Double
gopNumBFrames :: Maybe Natural
gopClosedCadence :: Maybe Natural
gopBReference :: Maybe H264GopBReference
framerateNumerator :: Maybe Natural
framerateDenominator :: Maybe Natural
framerateControl :: Maybe H264FramerateControl
forceFieldPictures :: Maybe H264ForceFieldPictures
flickerAq :: Maybe H264FlickerAq
fixedAfd :: Maybe FixedAfd
filterSettings :: Maybe H264FilterSettings
entropyEncoding :: Maybe H264EntropyEncoding
colorSpaceSettings :: Maybe H264ColorSpaceSettings
colorMetadata :: Maybe H264ColorMetadata
bufSize :: Maybe Natural
bufFillPct :: Maybe Natural
bitrate :: Maybe Natural
afdSignaling :: Maybe AfdSignaling
adaptiveQuantization :: Maybe H264AdaptiveQuantization
$sel:timecodeInsertion:H264Settings' :: H264Settings -> Maybe H264TimecodeInsertionBehavior
$sel:timecodeBurninSettings:H264Settings' :: H264Settings -> Maybe TimecodeBurninSettings
$sel:temporalAq:H264Settings' :: H264Settings -> Maybe H264TemporalAq
$sel:syntax:H264Settings' :: H264Settings -> Maybe H264Syntax
$sel:subgopLength:H264Settings' :: H264Settings -> Maybe H264SubGopLength
$sel:spatialAq:H264Settings' :: H264Settings -> Maybe H264SpatialAq
$sel:softness:H264Settings' :: H264Settings -> Maybe Natural
$sel:slices:H264Settings' :: H264Settings -> Maybe Natural
$sel:sceneChangeDetect:H264Settings' :: H264Settings -> Maybe H264SceneChangeDetect
$sel:scanType:H264Settings' :: H264Settings -> Maybe H264ScanType
$sel:rateControlMode:H264Settings' :: H264Settings -> Maybe H264RateControlMode
$sel:qvbrQualityLevel:H264Settings' :: H264Settings -> Maybe Natural
$sel:qualityLevel:H264Settings' :: H264Settings -> Maybe H264QualityLevel
$sel:profile:H264Settings' :: H264Settings -> Maybe H264Profile
$sel:parNumerator:H264Settings' :: H264Settings -> Maybe Natural
$sel:parDenominator:H264Settings' :: H264Settings -> Maybe Natural
$sel:parControl:H264Settings' :: H264Settings -> Maybe H264ParControl
$sel:numRefFrames:H264Settings' :: H264Settings -> Maybe Natural
$sel:minIInterval:H264Settings' :: H264Settings -> Maybe Natural
$sel:maxBitrate:H264Settings' :: H264Settings -> Maybe Natural
$sel:lookAheadRateControl:H264Settings' :: H264Settings -> Maybe H264LookAheadRateControl
$sel:level:H264Settings' :: H264Settings -> Maybe H264Level
$sel:gopSizeUnits:H264Settings' :: H264Settings -> Maybe H264GopSizeUnits
$sel:gopSize:H264Settings' :: H264Settings -> Maybe Double
$sel:gopNumBFrames:H264Settings' :: H264Settings -> Maybe Natural
$sel:gopClosedCadence:H264Settings' :: H264Settings -> Maybe Natural
$sel:gopBReference:H264Settings' :: H264Settings -> Maybe H264GopBReference
$sel:framerateNumerator:H264Settings' :: H264Settings -> Maybe Natural
$sel:framerateDenominator:H264Settings' :: H264Settings -> Maybe Natural
$sel:framerateControl:H264Settings' :: H264Settings -> Maybe H264FramerateControl
$sel:forceFieldPictures:H264Settings' :: H264Settings -> Maybe H264ForceFieldPictures
$sel:flickerAq:H264Settings' :: H264Settings -> Maybe H264FlickerAq
$sel:fixedAfd:H264Settings' :: H264Settings -> Maybe FixedAfd
$sel:filterSettings:H264Settings' :: H264Settings -> Maybe H264FilterSettings
$sel:entropyEncoding:H264Settings' :: H264Settings -> Maybe H264EntropyEncoding
$sel:colorSpaceSettings:H264Settings' :: H264Settings -> Maybe H264ColorSpaceSettings
$sel:colorMetadata:H264Settings' :: H264Settings -> Maybe H264ColorMetadata
$sel:bufSize:H264Settings' :: H264Settings -> Maybe Natural
$sel:bufFillPct:H264Settings' :: H264Settings -> Maybe Natural
$sel:bitrate:H264Settings' :: H264Settings -> Maybe Natural
$sel:afdSignaling:H264Settings' :: H264Settings -> Maybe AfdSignaling
$sel:adaptiveQuantization:H264Settings' :: H264Settings -> Maybe H264AdaptiveQuantization
..} =
forall a. NFData a => a -> ()
Prelude.rnf Maybe H264AdaptiveQuantization
adaptiveQuantization
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe AfdSignaling
afdSignaling
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
bitrate
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
bufFillPct
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
bufSize
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe H264ColorMetadata
colorMetadata
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe H264ColorSpaceSettings
colorSpaceSettings
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe H264EntropyEncoding
entropyEncoding
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe H264FilterSettings
filterSettings
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe FixedAfd
fixedAfd
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe H264FlickerAq
flickerAq
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe H264ForceFieldPictures
forceFieldPictures
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe H264FramerateControl
framerateControl
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
framerateDenominator
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
framerateNumerator
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe H264GopBReference
gopBReference
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
gopClosedCadence
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
gopNumBFrames
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Double
gopSize
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe H264GopSizeUnits
gopSizeUnits
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe H264Level
level
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe H264LookAheadRateControl
lookAheadRateControl
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
maxBitrate
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe Natural
minIInterval
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe Natural
numRefFrames
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe H264ParControl
parControl
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe Natural
parDenominator
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe Natural
parNumerator
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe H264Profile
profile
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe H264QualityLevel
qualityLevel
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe Natural
qvbrQualityLevel
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe H264RateControlMode
rateControlMode
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe H264ScanType
scanType
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe H264SceneChangeDetect
sceneChangeDetect
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe Natural
slices
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe Natural
softness
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe H264SpatialAq
spatialAq
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe H264SubGopLength
subgopLength
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe H264Syntax
syntax
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe H264TemporalAq
temporalAq
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe TimecodeBurninSettings
timecodeBurninSettings
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe H264TimecodeInsertionBehavior
timecodeInsertion
instance Data.ToJSON H264Settings where
toJSON :: H264Settings -> Value
toJSON H264Settings' {Maybe Double
Maybe Natural
Maybe AfdSignaling
Maybe FixedAfd
Maybe H264AdaptiveQuantization
Maybe H264ColorMetadata
Maybe H264EntropyEncoding
Maybe H264FlickerAq
Maybe H264ForceFieldPictures
Maybe H264FramerateControl
Maybe H264GopBReference
Maybe H264GopSizeUnits
Maybe H264Level
Maybe H264LookAheadRateControl
Maybe H264ParControl
Maybe H264Profile
Maybe H264QualityLevel
Maybe H264RateControlMode
Maybe H264ScanType
Maybe H264SceneChangeDetect
Maybe H264SpatialAq
Maybe H264SubGopLength
Maybe H264Syntax
Maybe H264TemporalAq
Maybe H264TimecodeInsertionBehavior
Maybe H264ColorSpaceSettings
Maybe H264FilterSettings
Maybe TimecodeBurninSettings
timecodeInsertion :: Maybe H264TimecodeInsertionBehavior
timecodeBurninSettings :: Maybe TimecodeBurninSettings
temporalAq :: Maybe H264TemporalAq
syntax :: Maybe H264Syntax
subgopLength :: Maybe H264SubGopLength
spatialAq :: Maybe H264SpatialAq
softness :: Maybe Natural
slices :: Maybe Natural
sceneChangeDetect :: Maybe H264SceneChangeDetect
scanType :: Maybe H264ScanType
rateControlMode :: Maybe H264RateControlMode
qvbrQualityLevel :: Maybe Natural
qualityLevel :: Maybe H264QualityLevel
profile :: Maybe H264Profile
parNumerator :: Maybe Natural
parDenominator :: Maybe Natural
parControl :: Maybe H264ParControl
numRefFrames :: Maybe Natural
minIInterval :: Maybe Natural
maxBitrate :: Maybe Natural
lookAheadRateControl :: Maybe H264LookAheadRateControl
level :: Maybe H264Level
gopSizeUnits :: Maybe H264GopSizeUnits
gopSize :: Maybe Double
gopNumBFrames :: Maybe Natural
gopClosedCadence :: Maybe Natural
gopBReference :: Maybe H264GopBReference
framerateNumerator :: Maybe Natural
framerateDenominator :: Maybe Natural
framerateControl :: Maybe H264FramerateControl
forceFieldPictures :: Maybe H264ForceFieldPictures
flickerAq :: Maybe H264FlickerAq
fixedAfd :: Maybe FixedAfd
filterSettings :: Maybe H264FilterSettings
entropyEncoding :: Maybe H264EntropyEncoding
colorSpaceSettings :: Maybe H264ColorSpaceSettings
colorMetadata :: Maybe H264ColorMetadata
bufSize :: Maybe Natural
bufFillPct :: Maybe Natural
bitrate :: Maybe Natural
afdSignaling :: Maybe AfdSignaling
adaptiveQuantization :: Maybe H264AdaptiveQuantization
$sel:timecodeInsertion:H264Settings' :: H264Settings -> Maybe H264TimecodeInsertionBehavior
$sel:timecodeBurninSettings:H264Settings' :: H264Settings -> Maybe TimecodeBurninSettings
$sel:temporalAq:H264Settings' :: H264Settings -> Maybe H264TemporalAq
$sel:syntax:H264Settings' :: H264Settings -> Maybe H264Syntax
$sel:subgopLength:H264Settings' :: H264Settings -> Maybe H264SubGopLength
$sel:spatialAq:H264Settings' :: H264Settings -> Maybe H264SpatialAq
$sel:softness:H264Settings' :: H264Settings -> Maybe Natural
$sel:slices:H264Settings' :: H264Settings -> Maybe Natural
$sel:sceneChangeDetect:H264Settings' :: H264Settings -> Maybe H264SceneChangeDetect
$sel:scanType:H264Settings' :: H264Settings -> Maybe H264ScanType
$sel:rateControlMode:H264Settings' :: H264Settings -> Maybe H264RateControlMode
$sel:qvbrQualityLevel:H264Settings' :: H264Settings -> Maybe Natural
$sel:qualityLevel:H264Settings' :: H264Settings -> Maybe H264QualityLevel
$sel:profile:H264Settings' :: H264Settings -> Maybe H264Profile
$sel:parNumerator:H264Settings' :: H264Settings -> Maybe Natural
$sel:parDenominator:H264Settings' :: H264Settings -> Maybe Natural
$sel:parControl:H264Settings' :: H264Settings -> Maybe H264ParControl
$sel:numRefFrames:H264Settings' :: H264Settings -> Maybe Natural
$sel:minIInterval:H264Settings' :: H264Settings -> Maybe Natural
$sel:maxBitrate:H264Settings' :: H264Settings -> Maybe Natural
$sel:lookAheadRateControl:H264Settings' :: H264Settings -> Maybe H264LookAheadRateControl
$sel:level:H264Settings' :: H264Settings -> Maybe H264Level
$sel:gopSizeUnits:H264Settings' :: H264Settings -> Maybe H264GopSizeUnits
$sel:gopSize:H264Settings' :: H264Settings -> Maybe Double
$sel:gopNumBFrames:H264Settings' :: H264Settings -> Maybe Natural
$sel:gopClosedCadence:H264Settings' :: H264Settings -> Maybe Natural
$sel:gopBReference:H264Settings' :: H264Settings -> Maybe H264GopBReference
$sel:framerateNumerator:H264Settings' :: H264Settings -> Maybe Natural
$sel:framerateDenominator:H264Settings' :: H264Settings -> Maybe Natural
$sel:framerateControl:H264Settings' :: H264Settings -> Maybe H264FramerateControl
$sel:forceFieldPictures:H264Settings' :: H264Settings -> Maybe H264ForceFieldPictures
$sel:flickerAq:H264Settings' :: H264Settings -> Maybe H264FlickerAq
$sel:fixedAfd:H264Settings' :: H264Settings -> Maybe FixedAfd
$sel:filterSettings:H264Settings' :: H264Settings -> Maybe H264FilterSettings
$sel:entropyEncoding:H264Settings' :: H264Settings -> Maybe H264EntropyEncoding
$sel:colorSpaceSettings:H264Settings' :: H264Settings -> Maybe H264ColorSpaceSettings
$sel:colorMetadata:H264Settings' :: H264Settings -> Maybe H264ColorMetadata
$sel:bufSize:H264Settings' :: H264Settings -> Maybe Natural
$sel:bufFillPct:H264Settings' :: H264Settings -> Maybe Natural
$sel:bitrate:H264Settings' :: H264Settings -> Maybe Natural
$sel:afdSignaling:H264Settings' :: H264Settings -> Maybe AfdSignaling
$sel:adaptiveQuantization:H264Settings' :: H264Settings -> Maybe H264AdaptiveQuantization
..} =
[Pair] -> Value
Data.object
( forall a. [Maybe a] -> [a]
Prelude.catMaybes
[ (Key
"adaptiveQuantization" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264AdaptiveQuantization
adaptiveQuantization,
(Key
"afdSignaling" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AfdSignaling
afdSignaling,
(Key
"bitrate" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
bitrate,
(Key
"bufFillPct" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
bufFillPct,
(Key
"bufSize" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
bufSize,
(Key
"colorMetadata" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264ColorMetadata
colorMetadata,
(Key
"colorSpaceSettings" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264ColorSpaceSettings
colorSpaceSettings,
(Key
"entropyEncoding" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264EntropyEncoding
entropyEncoding,
(Key
"filterSettings" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264FilterSettings
filterSettings,
(Key
"fixedAfd" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe FixedAfd
fixedAfd,
(Key
"flickerAq" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264FlickerAq
flickerAq,
(Key
"forceFieldPictures" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264ForceFieldPictures
forceFieldPictures,
(Key
"framerateControl" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264FramerateControl
framerateControl,
(Key
"framerateDenominator" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
framerateDenominator,
(Key
"framerateNumerator" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
framerateNumerator,
(Key
"gopBReference" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264GopBReference
gopBReference,
(Key
"gopClosedCadence" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
gopClosedCadence,
(Key
"gopNumBFrames" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
gopNumBFrames,
(Key
"gopSize" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Double
gopSize,
(Key
"gopSizeUnits" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264GopSizeUnits
gopSizeUnits,
(Key
"level" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264Level
level,
(Key
"lookAheadRateControl" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264LookAheadRateControl
lookAheadRateControl,
(Key
"maxBitrate" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
maxBitrate,
(Key
"minIInterval" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
minIInterval,
(Key
"numRefFrames" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
numRefFrames,
(Key
"parControl" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264ParControl
parControl,
(Key
"parDenominator" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
parDenominator,
(Key
"parNumerator" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
parNumerator,
(Key
"profile" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264Profile
profile,
(Key
"qualityLevel" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264QualityLevel
qualityLevel,
(Key
"qvbrQualityLevel" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
qvbrQualityLevel,
(Key
"rateControlMode" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264RateControlMode
rateControlMode,
(Key
"scanType" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264ScanType
scanType,
(Key
"sceneChangeDetect" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264SceneChangeDetect
sceneChangeDetect,
(Key
"slices" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
slices,
(Key
"softness" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
softness,
(Key
"spatialAq" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264SpatialAq
spatialAq,
(Key
"subgopLength" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264SubGopLength
subgopLength,
(Key
"syntax" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264Syntax
syntax,
(Key
"temporalAq" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264TemporalAq
temporalAq,
(Key
"timecodeBurninSettings" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TimecodeBurninSettings
timecodeBurninSettings,
(Key
"timecodeInsertion" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe H264TimecodeInsertionBehavior
timecodeInsertion
]
)