{-# 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 #-}

-- Derived from AWS service descriptions, licensed under Apache 2.0.

-- |
-- Module      : Amazonka.MediaConvert.Types.CmfcSettings
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
module Amazonka.MediaConvert.Types.CmfcSettings where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.MediaConvert.Types.CmfcAudioDuration
import Amazonka.MediaConvert.Types.CmfcAudioTrackType
import Amazonka.MediaConvert.Types.CmfcDescriptiveVideoServiceFlag
import Amazonka.MediaConvert.Types.CmfcIFrameOnlyManifest
import Amazonka.MediaConvert.Types.CmfcKlvMetadata
import Amazonka.MediaConvert.Types.CmfcManifestMetadataSignaling
import Amazonka.MediaConvert.Types.CmfcScte35Esam
import Amazonka.MediaConvert.Types.CmfcScte35Source
import Amazonka.MediaConvert.Types.CmfcTimedMetadata
import Amazonka.MediaConvert.Types.CmfcTimedMetadataBoxVersion
import qualified Amazonka.Prelude as Prelude

-- | These settings relate to the fragmented MP4 container for the segments
-- in your CMAF outputs.
--
-- /See:/ 'newCmfcSettings' smart constructor.
data CmfcSettings = CmfcSettings'
  { -- | Specify this setting only when your output will be consumed by a
    -- downstream repackaging workflow that is sensitive to very small duration
    -- differences between video and audio. For this situation, choose Match
    -- video duration (MATCH_VIDEO_DURATION). In all other cases, keep the
    -- default value, Default codec duration (DEFAULT_CODEC_DURATION). When you
    -- choose Match video duration, MediaConvert pads the output audio streams
    -- with silence or trims them to ensure that the total duration of each
    -- audio stream is at least as long as the total duration of the video
    -- stream. After padding or trimming, the audio stream duration is no more
    -- than one frame longer than the video stream. MediaConvert applies audio
    -- padding or trimming only to the end of the last segment of the output.
    -- For unsegmented outputs, MediaConvert adds padding only to the end of
    -- the file. When you keep the default value, any minor discrepancies
    -- between audio and video duration will depend on your output audio codec.
    CmfcSettings -> Maybe CmfcAudioDuration
audioDuration :: Prelude.Maybe CmfcAudioDuration,
    -- | Specify the audio rendition group for this audio rendition. Specify up
    -- to one value for each audio output in your output group. This value
    -- appears in your HLS parent manifest in the EXT-X-MEDIA tag of
    -- TYPE=AUDIO, as the value for the GROUP-ID attribute. For example, if you
    -- specify \"audio_aac_1\" for Audio group ID, it appears in your manifest
    -- like this: #EXT-X-MEDIA:TYPE=AUDIO,GROUP-ID=\"audio_aac_1\". Related
    -- setting: To associate the rendition group that this audio track belongs
    -- to with a video rendition, include the same value that you provide here
    -- for that video output\'s setting Audio rendition sets
    -- (audioRenditionSets).
    CmfcSettings -> Maybe Text
audioGroupId :: Prelude.Maybe Prelude.Text,
    -- | List the audio rendition groups that you want included with this video
    -- rendition. Use a comma-separated list. For example, say you want to
    -- include the audio rendition groups that have the audio group IDs
    -- \"audio_aac_1\" and \"audio_dolby\". Then you would specify this value:
    -- \"audio_aac_1,audio_dolby\". Related setting: The rendition groups that
    -- you include in your comma-separated list should all match values that
    -- you specify in the setting Audio group ID (AudioGroupId) for audio
    -- renditions in the same output group as this video rendition. Default
    -- behavior: If you don\'t specify anything here and for Audio group ID,
    -- MediaConvert puts each audio variant in its own audio rendition group
    -- and associates it with every video variant. Each value in your list
    -- appears in your HLS parent manifest in the EXT-X-STREAM-INF tag as the
    -- value for the AUDIO attribute. To continue the previous example, say
    -- that the file name for the child manifest for your video rendition is
    -- \"amazing_video_1.m3u8\". Then, in your parent manifest, each value will
    -- appear on separate lines, like this:
    -- #EXT-X-STREAM-INF:AUDIO=\"audio_aac_1\"... amazing_video_1.m3u8
    -- #EXT-X-STREAM-INF:AUDIO=\"audio_dolby\"... amazing_video_1.m3u8
    CmfcSettings -> Maybe Text
audioRenditionSets :: Prelude.Maybe Prelude.Text,
    -- | Use this setting to control the values that MediaConvert puts in your
    -- HLS parent playlist to control how the client player selects which audio
    -- track to play. The other options for this setting determine the values
    -- that MediaConvert writes for the DEFAULT and AUTOSELECT attributes of
    -- the EXT-X-MEDIA entry for the audio variant. For more information about
    -- these attributes, see the Apple documentation article
    -- https:\/\/developer.apple.com\/documentation\/http_live_streaming\/example_playlists_for_http_live_streaming\/adding_alternate_media_to_a_playlist.
    -- Choose Alternate audio, auto select, default
    -- (ALTERNATE_AUDIO_AUTO_SELECT_DEFAULT) to set DEFAULT=YES and
    -- AUTOSELECT=YES. Choose this value for only one variant in your output
    -- group. Choose Alternate audio, auto select, not default
    -- (ALTERNATE_AUDIO_AUTO_SELECT) to set DEFAULT=NO and AUTOSELECT=YES.
    -- Choose Alternate Audio, Not Auto Select to set DEFAULT=NO and
    -- AUTOSELECT=NO. When you don\'t specify a value for this setting,
    -- MediaConvert defaults to Alternate audio, auto select, default. When
    -- there is more than one variant in your output group, you must explicitly
    -- choose a value for this setting.
    CmfcSettings -> Maybe CmfcAudioTrackType
audioTrackType :: Prelude.Maybe CmfcAudioTrackType,
    -- | Specify whether to flag this audio track as descriptive video service
    -- (DVS) in your HLS parent manifest. When you choose Flag (FLAG),
    -- MediaConvert includes the parameter
    -- CHARACTERISTICS=\"public.accessibility.describes-video\" in the
    -- EXT-X-MEDIA entry for this track. When you keep the default choice,
    -- Don\'t flag (DONT_FLAG), MediaConvert leaves this parameter out. The DVS
    -- flag can help with accessibility on Apple devices. For more information,
    -- see the Apple documentation.
    CmfcSettings -> Maybe CmfcDescriptiveVideoServiceFlag
descriptiveVideoServiceFlag :: Prelude.Maybe CmfcDescriptiveVideoServiceFlag,
    -- | Choose Include (INCLUDE) to have MediaConvert generate an HLS child
    -- manifest that lists only the I-frames for this rendition, in addition to
    -- your regular manifest for this rendition. You might use this manifest as
    -- part of a workflow that creates preview functions for your video.
    -- MediaConvert adds both the I-frame only child manifest and the regular
    -- child manifest to the parent manifest. When you don\'t need the I-frame
    -- only child manifest, keep the default value Exclude (EXCLUDE).
    CmfcSettings -> Maybe CmfcIFrameOnlyManifest
iFrameOnlyManifest :: Prelude.Maybe CmfcIFrameOnlyManifest,
    -- | To include key-length-value metadata in this output: Set KLV metadata
    -- insertion to Passthrough. MediaConvert reads KLV metadata present in
    -- your input and writes each instance to a separate event message box in
    -- the output, according to MISB ST1910.1. To exclude this KLV metadata:
    -- Set KLV metadata insertion to None or leave blank.
    CmfcSettings -> Maybe CmfcKlvMetadata
klvMetadata :: Prelude.Maybe CmfcKlvMetadata,
    -- | To add an InbandEventStream element in your output MPD manifest for each
    -- type of event message, set Manifest metadata signaling to Enabled. For
    -- ID3 event messages, the InbandEventStream element schemeIdUri will be
    -- same value that you specify for ID3 metadata scheme ID URI. For SCTE35
    -- event messages, the InbandEventStream element schemeIdUri will be
    -- \"urn:scte:scte35:2013:bin\". To leave these elements out of your output
    -- MPD manifest, set Manifest metadata signaling to Disabled.
    CmfcSettings -> Maybe CmfcManifestMetadataSignaling
manifestMetadataSignaling :: Prelude.Maybe CmfcManifestMetadataSignaling,
    -- | Use this setting only when you specify SCTE-35 markers from ESAM. Choose
    -- INSERT to put SCTE-35 markers in this output at the insertion points
    -- that you specify in an ESAM XML document. Provide the document in the
    -- setting SCC XML (sccXml).
    CmfcSettings -> Maybe CmfcScte35Esam
scte35Esam :: Prelude.Maybe CmfcScte35Esam,
    -- | Ignore this setting unless you have SCTE-35 markers in your input video
    -- file. Choose Passthrough (PASSTHROUGH) if you want SCTE-35 markers that
    -- appear in your input to also appear in this output. Choose None (NONE)
    -- if you don\'t want those SCTE-35 markers in this output.
    CmfcSettings -> Maybe CmfcScte35Source
scte35Source :: Prelude.Maybe CmfcScte35Source,
    -- | To include ID3 metadata in this output: Set ID3 metadata (timedMetadata)
    -- to Passthrough (PASSTHROUGH). Specify this ID3 metadata in Custom ID3
    -- metadata inserter (timedMetadataInsertion). MediaConvert writes each
    -- instance of ID3 metadata in a separate Event Message (eMSG) box. To
    -- exclude this ID3 metadata: Set ID3 metadata to None (NONE) or leave
    -- blank.
    CmfcSettings -> Maybe CmfcTimedMetadata
timedMetadata :: Prelude.Maybe CmfcTimedMetadata,
    -- | Specify the event message box (eMSG) version for ID3 timed metadata in
    -- your output. For more information, see ISO\/IEC 23009-1:2022 section
    -- 5.10.3.3.3 Syntax. Leave blank to use the default value Version 0. When
    -- you specify Version 1, you must also set ID3 metadata (timedMetadata) to
    -- Passthrough.
    CmfcSettings -> Maybe CmfcTimedMetadataBoxVersion
timedMetadataBoxVersion :: Prelude.Maybe CmfcTimedMetadataBoxVersion,
    -- | Specify the event message box (eMSG) scheme ID URI (scheme_id_uri) for
    -- ID3 timed metadata in your output. For more informaiton, see ISO\/IEC
    -- 23009-1:2022 section 5.10.3.3.4 Semantics. Leave blank to use the
    -- default value: https:\/\/aomedia.org\/emsg\/ID3 When you specify a value
    -- for ID3 metadata scheme ID URI, you must also set ID3 metadata
    -- (timedMetadata) to Passthrough.
    CmfcSettings -> Maybe Text
timedMetadataSchemeIdUri :: Prelude.Maybe Prelude.Text,
    -- | Specify the event message box (eMSG) value for ID3 timed metadata in
    -- your output. For more informaiton, see ISO\/IEC 23009-1:2022 section
    -- 5.10.3.3.4 Semantics. When you specify a value for ID3 Metadata Value,
    -- you must also set ID3 metadata (timedMetadata) to Passthrough.
    CmfcSettings -> Maybe Text
timedMetadataValue :: Prelude.Maybe Prelude.Text
  }
  deriving (CmfcSettings -> CmfcSettings -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: CmfcSettings -> CmfcSettings -> Bool
$c/= :: CmfcSettings -> CmfcSettings -> Bool
== :: CmfcSettings -> CmfcSettings -> Bool
$c== :: CmfcSettings -> CmfcSettings -> Bool
Prelude.Eq, ReadPrec [CmfcSettings]
ReadPrec CmfcSettings
Int -> ReadS CmfcSettings
ReadS [CmfcSettings]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [CmfcSettings]
$creadListPrec :: ReadPrec [CmfcSettings]
readPrec :: ReadPrec CmfcSettings
$creadPrec :: ReadPrec CmfcSettings
readList :: ReadS [CmfcSettings]
$creadList :: ReadS [CmfcSettings]
readsPrec :: Int -> ReadS CmfcSettings
$creadsPrec :: Int -> ReadS CmfcSettings
Prelude.Read, Int -> CmfcSettings -> ShowS
[CmfcSettings] -> ShowS
CmfcSettings -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [CmfcSettings] -> ShowS
$cshowList :: [CmfcSettings] -> ShowS
show :: CmfcSettings -> String
$cshow :: CmfcSettings -> String
showsPrec :: Int -> CmfcSettings -> ShowS
$cshowsPrec :: Int -> CmfcSettings -> ShowS
Prelude.Show, forall x. Rep CmfcSettings x -> CmfcSettings
forall x. CmfcSettings -> Rep CmfcSettings x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep CmfcSettings x -> CmfcSettings
$cfrom :: forall x. CmfcSettings -> Rep CmfcSettings x
Prelude.Generic)

-- |
-- Create a value of 'CmfcSettings' with all optional fields omitted.
--
-- Use <https://hackage.haskell.org/package/generic-lens generic-lens> or <https://hackage.haskell.org/package/optics optics> to modify other optional fields.
--
-- The following record fields are available, with the corresponding lenses provided
-- for backwards compatibility:
--
-- 'audioDuration', 'cmfcSettings_audioDuration' - Specify this setting only when your output will be consumed by a
-- downstream repackaging workflow that is sensitive to very small duration
-- differences between video and audio. For this situation, choose Match
-- video duration (MATCH_VIDEO_DURATION). In all other cases, keep the
-- default value, Default codec duration (DEFAULT_CODEC_DURATION). When you
-- choose Match video duration, MediaConvert pads the output audio streams
-- with silence or trims them to ensure that the total duration of each
-- audio stream is at least as long as the total duration of the video
-- stream. After padding or trimming, the audio stream duration is no more
-- than one frame longer than the video stream. MediaConvert applies audio
-- padding or trimming only to the end of the last segment of the output.
-- For unsegmented outputs, MediaConvert adds padding only to the end of
-- the file. When you keep the default value, any minor discrepancies
-- between audio and video duration will depend on your output audio codec.
--
-- 'audioGroupId', 'cmfcSettings_audioGroupId' - Specify the audio rendition group for this audio rendition. Specify up
-- to one value for each audio output in your output group. This value
-- appears in your HLS parent manifest in the EXT-X-MEDIA tag of
-- TYPE=AUDIO, as the value for the GROUP-ID attribute. For example, if you
-- specify \"audio_aac_1\" for Audio group ID, it appears in your manifest
-- like this: #EXT-X-MEDIA:TYPE=AUDIO,GROUP-ID=\"audio_aac_1\". Related
-- setting: To associate the rendition group that this audio track belongs
-- to with a video rendition, include the same value that you provide here
-- for that video output\'s setting Audio rendition sets
-- (audioRenditionSets).
--
-- 'audioRenditionSets', 'cmfcSettings_audioRenditionSets' - List the audio rendition groups that you want included with this video
-- rendition. Use a comma-separated list. For example, say you want to
-- include the audio rendition groups that have the audio group IDs
-- \"audio_aac_1\" and \"audio_dolby\". Then you would specify this value:
-- \"audio_aac_1,audio_dolby\". Related setting: The rendition groups that
-- you include in your comma-separated list should all match values that
-- you specify in the setting Audio group ID (AudioGroupId) for audio
-- renditions in the same output group as this video rendition. Default
-- behavior: If you don\'t specify anything here and for Audio group ID,
-- MediaConvert puts each audio variant in its own audio rendition group
-- and associates it with every video variant. Each value in your list
-- appears in your HLS parent manifest in the EXT-X-STREAM-INF tag as the
-- value for the AUDIO attribute. To continue the previous example, say
-- that the file name for the child manifest for your video rendition is
-- \"amazing_video_1.m3u8\". Then, in your parent manifest, each value will
-- appear on separate lines, like this:
-- #EXT-X-STREAM-INF:AUDIO=\"audio_aac_1\"... amazing_video_1.m3u8
-- #EXT-X-STREAM-INF:AUDIO=\"audio_dolby\"... amazing_video_1.m3u8
--
-- 'audioTrackType', 'cmfcSettings_audioTrackType' - Use this setting to control the values that MediaConvert puts in your
-- HLS parent playlist to control how the client player selects which audio
-- track to play. The other options for this setting determine the values
-- that MediaConvert writes for the DEFAULT and AUTOSELECT attributes of
-- the EXT-X-MEDIA entry for the audio variant. For more information about
-- these attributes, see the Apple documentation article
-- https:\/\/developer.apple.com\/documentation\/http_live_streaming\/example_playlists_for_http_live_streaming\/adding_alternate_media_to_a_playlist.
-- Choose Alternate audio, auto select, default
-- (ALTERNATE_AUDIO_AUTO_SELECT_DEFAULT) to set DEFAULT=YES and
-- AUTOSELECT=YES. Choose this value for only one variant in your output
-- group. Choose Alternate audio, auto select, not default
-- (ALTERNATE_AUDIO_AUTO_SELECT) to set DEFAULT=NO and AUTOSELECT=YES.
-- Choose Alternate Audio, Not Auto Select to set DEFAULT=NO and
-- AUTOSELECT=NO. When you don\'t specify a value for this setting,
-- MediaConvert defaults to Alternate audio, auto select, default. When
-- there is more than one variant in your output group, you must explicitly
-- choose a value for this setting.
--
-- 'descriptiveVideoServiceFlag', 'cmfcSettings_descriptiveVideoServiceFlag' - Specify whether to flag this audio track as descriptive video service
-- (DVS) in your HLS parent manifest. When you choose Flag (FLAG),
-- MediaConvert includes the parameter
-- CHARACTERISTICS=\"public.accessibility.describes-video\" in the
-- EXT-X-MEDIA entry for this track. When you keep the default choice,
-- Don\'t flag (DONT_FLAG), MediaConvert leaves this parameter out. The DVS
-- flag can help with accessibility on Apple devices. For more information,
-- see the Apple documentation.
--
-- 'iFrameOnlyManifest', 'cmfcSettings_iFrameOnlyManifest' - Choose Include (INCLUDE) to have MediaConvert generate an HLS child
-- manifest that lists only the I-frames for this rendition, in addition to
-- your regular manifest for this rendition. You might use this manifest as
-- part of a workflow that creates preview functions for your video.
-- MediaConvert adds both the I-frame only child manifest and the regular
-- child manifest to the parent manifest. When you don\'t need the I-frame
-- only child manifest, keep the default value Exclude (EXCLUDE).
--
-- 'klvMetadata', 'cmfcSettings_klvMetadata' - To include key-length-value metadata in this output: Set KLV metadata
-- insertion to Passthrough. MediaConvert reads KLV metadata present in
-- your input and writes each instance to a separate event message box in
-- the output, according to MISB ST1910.1. To exclude this KLV metadata:
-- Set KLV metadata insertion to None or leave blank.
--
-- 'manifestMetadataSignaling', 'cmfcSettings_manifestMetadataSignaling' - To add an InbandEventStream element in your output MPD manifest for each
-- type of event message, set Manifest metadata signaling to Enabled. For
-- ID3 event messages, the InbandEventStream element schemeIdUri will be
-- same value that you specify for ID3 metadata scheme ID URI. For SCTE35
-- event messages, the InbandEventStream element schemeIdUri will be
-- \"urn:scte:scte35:2013:bin\". To leave these elements out of your output
-- MPD manifest, set Manifest metadata signaling to Disabled.
--
-- 'scte35Esam', 'cmfcSettings_scte35Esam' - Use this setting only when you specify SCTE-35 markers from ESAM. Choose
-- INSERT to put SCTE-35 markers in this output at the insertion points
-- that you specify in an ESAM XML document. Provide the document in the
-- setting SCC XML (sccXml).
--
-- 'scte35Source', 'cmfcSettings_scte35Source' - Ignore this setting unless you have SCTE-35 markers in your input video
-- file. Choose Passthrough (PASSTHROUGH) if you want SCTE-35 markers that
-- appear in your input to also appear in this output. Choose None (NONE)
-- if you don\'t want those SCTE-35 markers in this output.
--
-- 'timedMetadata', 'cmfcSettings_timedMetadata' - To include ID3 metadata in this output: Set ID3 metadata (timedMetadata)
-- to Passthrough (PASSTHROUGH). Specify this ID3 metadata in Custom ID3
-- metadata inserter (timedMetadataInsertion). MediaConvert writes each
-- instance of ID3 metadata in a separate Event Message (eMSG) box. To
-- exclude this ID3 metadata: Set ID3 metadata to None (NONE) or leave
-- blank.
--
-- 'timedMetadataBoxVersion', 'cmfcSettings_timedMetadataBoxVersion' - Specify the event message box (eMSG) version for ID3 timed metadata in
-- your output. For more information, see ISO\/IEC 23009-1:2022 section
-- 5.10.3.3.3 Syntax. Leave blank to use the default value Version 0. When
-- you specify Version 1, you must also set ID3 metadata (timedMetadata) to
-- Passthrough.
--
-- 'timedMetadataSchemeIdUri', 'cmfcSettings_timedMetadataSchemeIdUri' - Specify the event message box (eMSG) scheme ID URI (scheme_id_uri) for
-- ID3 timed metadata in your output. For more informaiton, see ISO\/IEC
-- 23009-1:2022 section 5.10.3.3.4 Semantics. Leave blank to use the
-- default value: https:\/\/aomedia.org\/emsg\/ID3 When you specify a value
-- for ID3 metadata scheme ID URI, you must also set ID3 metadata
-- (timedMetadata) to Passthrough.
--
-- 'timedMetadataValue', 'cmfcSettings_timedMetadataValue' - Specify the event message box (eMSG) value for ID3 timed metadata in
-- your output. For more informaiton, see ISO\/IEC 23009-1:2022 section
-- 5.10.3.3.4 Semantics. When you specify a value for ID3 Metadata Value,
-- you must also set ID3 metadata (timedMetadata) to Passthrough.
newCmfcSettings ::
  CmfcSettings
newCmfcSettings :: CmfcSettings
newCmfcSettings =
  CmfcSettings'
    { $sel:audioDuration:CmfcSettings' :: Maybe CmfcAudioDuration
audioDuration = forall a. Maybe a
Prelude.Nothing,
      $sel:audioGroupId:CmfcSettings' :: Maybe Text
audioGroupId = forall a. Maybe a
Prelude.Nothing,
      $sel:audioRenditionSets:CmfcSettings' :: Maybe Text
audioRenditionSets = forall a. Maybe a
Prelude.Nothing,
      $sel:audioTrackType:CmfcSettings' :: Maybe CmfcAudioTrackType
audioTrackType = forall a. Maybe a
Prelude.Nothing,
      $sel:descriptiveVideoServiceFlag:CmfcSettings' :: Maybe CmfcDescriptiveVideoServiceFlag
descriptiveVideoServiceFlag = forall a. Maybe a
Prelude.Nothing,
      $sel:iFrameOnlyManifest:CmfcSettings' :: Maybe CmfcIFrameOnlyManifest
iFrameOnlyManifest = forall a. Maybe a
Prelude.Nothing,
      $sel:klvMetadata:CmfcSettings' :: Maybe CmfcKlvMetadata
klvMetadata = forall a. Maybe a
Prelude.Nothing,
      $sel:manifestMetadataSignaling:CmfcSettings' :: Maybe CmfcManifestMetadataSignaling
manifestMetadataSignaling = forall a. Maybe a
Prelude.Nothing,
      $sel:scte35Esam:CmfcSettings' :: Maybe CmfcScte35Esam
scte35Esam = forall a. Maybe a
Prelude.Nothing,
      $sel:scte35Source:CmfcSettings' :: Maybe CmfcScte35Source
scte35Source = forall a. Maybe a
Prelude.Nothing,
      $sel:timedMetadata:CmfcSettings' :: Maybe CmfcTimedMetadata
timedMetadata = forall a. Maybe a
Prelude.Nothing,
      $sel:timedMetadataBoxVersion:CmfcSettings' :: Maybe CmfcTimedMetadataBoxVersion
timedMetadataBoxVersion = forall a. Maybe a
Prelude.Nothing,
      $sel:timedMetadataSchemeIdUri:CmfcSettings' :: Maybe Text
timedMetadataSchemeIdUri = forall a. Maybe a
Prelude.Nothing,
      $sel:timedMetadataValue:CmfcSettings' :: Maybe Text
timedMetadataValue = forall a. Maybe a
Prelude.Nothing
    }

-- | Specify this setting only when your output will be consumed by a
-- downstream repackaging workflow that is sensitive to very small duration
-- differences between video and audio. For this situation, choose Match
-- video duration (MATCH_VIDEO_DURATION). In all other cases, keep the
-- default value, Default codec duration (DEFAULT_CODEC_DURATION). When you
-- choose Match video duration, MediaConvert pads the output audio streams
-- with silence or trims them to ensure that the total duration of each
-- audio stream is at least as long as the total duration of the video
-- stream. After padding or trimming, the audio stream duration is no more
-- than one frame longer than the video stream. MediaConvert applies audio
-- padding or trimming only to the end of the last segment of the output.
-- For unsegmented outputs, MediaConvert adds padding only to the end of
-- the file. When you keep the default value, any minor discrepancies
-- between audio and video duration will depend on your output audio codec.
cmfcSettings_audioDuration :: Lens.Lens' CmfcSettings (Prelude.Maybe CmfcAudioDuration)
cmfcSettings_audioDuration :: Lens' CmfcSettings (Maybe CmfcAudioDuration)
cmfcSettings_audioDuration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CmfcSettings' {Maybe CmfcAudioDuration
audioDuration :: Maybe CmfcAudioDuration
$sel:audioDuration:CmfcSettings' :: CmfcSettings -> Maybe CmfcAudioDuration
audioDuration} -> Maybe CmfcAudioDuration
audioDuration) (\s :: CmfcSettings
s@CmfcSettings' {} Maybe CmfcAudioDuration
a -> CmfcSettings
s {$sel:audioDuration:CmfcSettings' :: Maybe CmfcAudioDuration
audioDuration = Maybe CmfcAudioDuration
a} :: CmfcSettings)

-- | Specify the audio rendition group for this audio rendition. Specify up
-- to one value for each audio output in your output group. This value
-- appears in your HLS parent manifest in the EXT-X-MEDIA tag of
-- TYPE=AUDIO, as the value for the GROUP-ID attribute. For example, if you
-- specify \"audio_aac_1\" for Audio group ID, it appears in your manifest
-- like this: #EXT-X-MEDIA:TYPE=AUDIO,GROUP-ID=\"audio_aac_1\". Related
-- setting: To associate the rendition group that this audio track belongs
-- to with a video rendition, include the same value that you provide here
-- for that video output\'s setting Audio rendition sets
-- (audioRenditionSets).
cmfcSettings_audioGroupId :: Lens.Lens' CmfcSettings (Prelude.Maybe Prelude.Text)
cmfcSettings_audioGroupId :: Lens' CmfcSettings (Maybe Text)
cmfcSettings_audioGroupId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CmfcSettings' {Maybe Text
audioGroupId :: Maybe Text
$sel:audioGroupId:CmfcSettings' :: CmfcSettings -> Maybe Text
audioGroupId} -> Maybe Text
audioGroupId) (\s :: CmfcSettings
s@CmfcSettings' {} Maybe Text
a -> CmfcSettings
s {$sel:audioGroupId:CmfcSettings' :: Maybe Text
audioGroupId = Maybe Text
a} :: CmfcSettings)

-- | List the audio rendition groups that you want included with this video
-- rendition. Use a comma-separated list. For example, say you want to
-- include the audio rendition groups that have the audio group IDs
-- \"audio_aac_1\" and \"audio_dolby\". Then you would specify this value:
-- \"audio_aac_1,audio_dolby\". Related setting: The rendition groups that
-- you include in your comma-separated list should all match values that
-- you specify in the setting Audio group ID (AudioGroupId) for audio
-- renditions in the same output group as this video rendition. Default
-- behavior: If you don\'t specify anything here and for Audio group ID,
-- MediaConvert puts each audio variant in its own audio rendition group
-- and associates it with every video variant. Each value in your list
-- appears in your HLS parent manifest in the EXT-X-STREAM-INF tag as the
-- value for the AUDIO attribute. To continue the previous example, say
-- that the file name for the child manifest for your video rendition is
-- \"amazing_video_1.m3u8\". Then, in your parent manifest, each value will
-- appear on separate lines, like this:
-- #EXT-X-STREAM-INF:AUDIO=\"audio_aac_1\"... amazing_video_1.m3u8
-- #EXT-X-STREAM-INF:AUDIO=\"audio_dolby\"... amazing_video_1.m3u8
cmfcSettings_audioRenditionSets :: Lens.Lens' CmfcSettings (Prelude.Maybe Prelude.Text)
cmfcSettings_audioRenditionSets :: Lens' CmfcSettings (Maybe Text)
cmfcSettings_audioRenditionSets = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CmfcSettings' {Maybe Text
audioRenditionSets :: Maybe Text
$sel:audioRenditionSets:CmfcSettings' :: CmfcSettings -> Maybe Text
audioRenditionSets} -> Maybe Text
audioRenditionSets) (\s :: CmfcSettings
s@CmfcSettings' {} Maybe Text
a -> CmfcSettings
s {$sel:audioRenditionSets:CmfcSettings' :: Maybe Text
audioRenditionSets = Maybe Text
a} :: CmfcSettings)

-- | Use this setting to control the values that MediaConvert puts in your
-- HLS parent playlist to control how the client player selects which audio
-- track to play. The other options for this setting determine the values
-- that MediaConvert writes for the DEFAULT and AUTOSELECT attributes of
-- the EXT-X-MEDIA entry for the audio variant. For more information about
-- these attributes, see the Apple documentation article
-- https:\/\/developer.apple.com\/documentation\/http_live_streaming\/example_playlists_for_http_live_streaming\/adding_alternate_media_to_a_playlist.
-- Choose Alternate audio, auto select, default
-- (ALTERNATE_AUDIO_AUTO_SELECT_DEFAULT) to set DEFAULT=YES and
-- AUTOSELECT=YES. Choose this value for only one variant in your output
-- group. Choose Alternate audio, auto select, not default
-- (ALTERNATE_AUDIO_AUTO_SELECT) to set DEFAULT=NO and AUTOSELECT=YES.
-- Choose Alternate Audio, Not Auto Select to set DEFAULT=NO and
-- AUTOSELECT=NO. When you don\'t specify a value for this setting,
-- MediaConvert defaults to Alternate audio, auto select, default. When
-- there is more than one variant in your output group, you must explicitly
-- choose a value for this setting.
cmfcSettings_audioTrackType :: Lens.Lens' CmfcSettings (Prelude.Maybe CmfcAudioTrackType)
cmfcSettings_audioTrackType :: Lens' CmfcSettings (Maybe CmfcAudioTrackType)
cmfcSettings_audioTrackType = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CmfcSettings' {Maybe CmfcAudioTrackType
audioTrackType :: Maybe CmfcAudioTrackType
$sel:audioTrackType:CmfcSettings' :: CmfcSettings -> Maybe CmfcAudioTrackType
audioTrackType} -> Maybe CmfcAudioTrackType
audioTrackType) (\s :: CmfcSettings
s@CmfcSettings' {} Maybe CmfcAudioTrackType
a -> CmfcSettings
s {$sel:audioTrackType:CmfcSettings' :: Maybe CmfcAudioTrackType
audioTrackType = Maybe CmfcAudioTrackType
a} :: CmfcSettings)

-- | Specify whether to flag this audio track as descriptive video service
-- (DVS) in your HLS parent manifest. When you choose Flag (FLAG),
-- MediaConvert includes the parameter
-- CHARACTERISTICS=\"public.accessibility.describes-video\" in the
-- EXT-X-MEDIA entry for this track. When you keep the default choice,
-- Don\'t flag (DONT_FLAG), MediaConvert leaves this parameter out. The DVS
-- flag can help with accessibility on Apple devices. For more information,
-- see the Apple documentation.
cmfcSettings_descriptiveVideoServiceFlag :: Lens.Lens' CmfcSettings (Prelude.Maybe CmfcDescriptiveVideoServiceFlag)
cmfcSettings_descriptiveVideoServiceFlag :: Lens' CmfcSettings (Maybe CmfcDescriptiveVideoServiceFlag)
cmfcSettings_descriptiveVideoServiceFlag = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CmfcSettings' {Maybe CmfcDescriptiveVideoServiceFlag
descriptiveVideoServiceFlag :: Maybe CmfcDescriptiveVideoServiceFlag
$sel:descriptiveVideoServiceFlag:CmfcSettings' :: CmfcSettings -> Maybe CmfcDescriptiveVideoServiceFlag
descriptiveVideoServiceFlag} -> Maybe CmfcDescriptiveVideoServiceFlag
descriptiveVideoServiceFlag) (\s :: CmfcSettings
s@CmfcSettings' {} Maybe CmfcDescriptiveVideoServiceFlag
a -> CmfcSettings
s {$sel:descriptiveVideoServiceFlag:CmfcSettings' :: Maybe CmfcDescriptiveVideoServiceFlag
descriptiveVideoServiceFlag = Maybe CmfcDescriptiveVideoServiceFlag
a} :: CmfcSettings)

-- | Choose Include (INCLUDE) to have MediaConvert generate an HLS child
-- manifest that lists only the I-frames for this rendition, in addition to
-- your regular manifest for this rendition. You might use this manifest as
-- part of a workflow that creates preview functions for your video.
-- MediaConvert adds both the I-frame only child manifest and the regular
-- child manifest to the parent manifest. When you don\'t need the I-frame
-- only child manifest, keep the default value Exclude (EXCLUDE).
cmfcSettings_iFrameOnlyManifest :: Lens.Lens' CmfcSettings (Prelude.Maybe CmfcIFrameOnlyManifest)
cmfcSettings_iFrameOnlyManifest :: Lens' CmfcSettings (Maybe CmfcIFrameOnlyManifest)
cmfcSettings_iFrameOnlyManifest = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CmfcSettings' {Maybe CmfcIFrameOnlyManifest
iFrameOnlyManifest :: Maybe CmfcIFrameOnlyManifest
$sel:iFrameOnlyManifest:CmfcSettings' :: CmfcSettings -> Maybe CmfcIFrameOnlyManifest
iFrameOnlyManifest} -> Maybe CmfcIFrameOnlyManifest
iFrameOnlyManifest) (\s :: CmfcSettings
s@CmfcSettings' {} Maybe CmfcIFrameOnlyManifest
a -> CmfcSettings
s {$sel:iFrameOnlyManifest:CmfcSettings' :: Maybe CmfcIFrameOnlyManifest
iFrameOnlyManifest = Maybe CmfcIFrameOnlyManifest
a} :: CmfcSettings)

-- | To include key-length-value metadata in this output: Set KLV metadata
-- insertion to Passthrough. MediaConvert reads KLV metadata present in
-- your input and writes each instance to a separate event message box in
-- the output, according to MISB ST1910.1. To exclude this KLV metadata:
-- Set KLV metadata insertion to None or leave blank.
cmfcSettings_klvMetadata :: Lens.Lens' CmfcSettings (Prelude.Maybe CmfcKlvMetadata)
cmfcSettings_klvMetadata :: Lens' CmfcSettings (Maybe CmfcKlvMetadata)
cmfcSettings_klvMetadata = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CmfcSettings' {Maybe CmfcKlvMetadata
klvMetadata :: Maybe CmfcKlvMetadata
$sel:klvMetadata:CmfcSettings' :: CmfcSettings -> Maybe CmfcKlvMetadata
klvMetadata} -> Maybe CmfcKlvMetadata
klvMetadata) (\s :: CmfcSettings
s@CmfcSettings' {} Maybe CmfcKlvMetadata
a -> CmfcSettings
s {$sel:klvMetadata:CmfcSettings' :: Maybe CmfcKlvMetadata
klvMetadata = Maybe CmfcKlvMetadata
a} :: CmfcSettings)

-- | To add an InbandEventStream element in your output MPD manifest for each
-- type of event message, set Manifest metadata signaling to Enabled. For
-- ID3 event messages, the InbandEventStream element schemeIdUri will be
-- same value that you specify for ID3 metadata scheme ID URI. For SCTE35
-- event messages, the InbandEventStream element schemeIdUri will be
-- \"urn:scte:scte35:2013:bin\". To leave these elements out of your output
-- MPD manifest, set Manifest metadata signaling to Disabled.
cmfcSettings_manifestMetadataSignaling :: Lens.Lens' CmfcSettings (Prelude.Maybe CmfcManifestMetadataSignaling)
cmfcSettings_manifestMetadataSignaling :: Lens' CmfcSettings (Maybe CmfcManifestMetadataSignaling)
cmfcSettings_manifestMetadataSignaling = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CmfcSettings' {Maybe CmfcManifestMetadataSignaling
manifestMetadataSignaling :: Maybe CmfcManifestMetadataSignaling
$sel:manifestMetadataSignaling:CmfcSettings' :: CmfcSettings -> Maybe CmfcManifestMetadataSignaling
manifestMetadataSignaling} -> Maybe CmfcManifestMetadataSignaling
manifestMetadataSignaling) (\s :: CmfcSettings
s@CmfcSettings' {} Maybe CmfcManifestMetadataSignaling
a -> CmfcSettings
s {$sel:manifestMetadataSignaling:CmfcSettings' :: Maybe CmfcManifestMetadataSignaling
manifestMetadataSignaling = Maybe CmfcManifestMetadataSignaling
a} :: CmfcSettings)

-- | Use this setting only when you specify SCTE-35 markers from ESAM. Choose
-- INSERT to put SCTE-35 markers in this output at the insertion points
-- that you specify in an ESAM XML document. Provide the document in the
-- setting SCC XML (sccXml).
cmfcSettings_scte35Esam :: Lens.Lens' CmfcSettings (Prelude.Maybe CmfcScte35Esam)
cmfcSettings_scte35Esam :: Lens' CmfcSettings (Maybe CmfcScte35Esam)
cmfcSettings_scte35Esam = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CmfcSettings' {Maybe CmfcScte35Esam
scte35Esam :: Maybe CmfcScte35Esam
$sel:scte35Esam:CmfcSettings' :: CmfcSettings -> Maybe CmfcScte35Esam
scte35Esam} -> Maybe CmfcScte35Esam
scte35Esam) (\s :: CmfcSettings
s@CmfcSettings' {} Maybe CmfcScte35Esam
a -> CmfcSettings
s {$sel:scte35Esam:CmfcSettings' :: Maybe CmfcScte35Esam
scte35Esam = Maybe CmfcScte35Esam
a} :: CmfcSettings)

-- | Ignore this setting unless you have SCTE-35 markers in your input video
-- file. Choose Passthrough (PASSTHROUGH) if you want SCTE-35 markers that
-- appear in your input to also appear in this output. Choose None (NONE)
-- if you don\'t want those SCTE-35 markers in this output.
cmfcSettings_scte35Source :: Lens.Lens' CmfcSettings (Prelude.Maybe CmfcScte35Source)
cmfcSettings_scte35Source :: Lens' CmfcSettings (Maybe CmfcScte35Source)
cmfcSettings_scte35Source = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CmfcSettings' {Maybe CmfcScte35Source
scte35Source :: Maybe CmfcScte35Source
$sel:scte35Source:CmfcSettings' :: CmfcSettings -> Maybe CmfcScte35Source
scte35Source} -> Maybe CmfcScte35Source
scte35Source) (\s :: CmfcSettings
s@CmfcSettings' {} Maybe CmfcScte35Source
a -> CmfcSettings
s {$sel:scte35Source:CmfcSettings' :: Maybe CmfcScte35Source
scte35Source = Maybe CmfcScte35Source
a} :: CmfcSettings)

-- | To include ID3 metadata in this output: Set ID3 metadata (timedMetadata)
-- to Passthrough (PASSTHROUGH). Specify this ID3 metadata in Custom ID3
-- metadata inserter (timedMetadataInsertion). MediaConvert writes each
-- instance of ID3 metadata in a separate Event Message (eMSG) box. To
-- exclude this ID3 metadata: Set ID3 metadata to None (NONE) or leave
-- blank.
cmfcSettings_timedMetadata :: Lens.Lens' CmfcSettings (Prelude.Maybe CmfcTimedMetadata)
cmfcSettings_timedMetadata :: Lens' CmfcSettings (Maybe CmfcTimedMetadata)
cmfcSettings_timedMetadata = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CmfcSettings' {Maybe CmfcTimedMetadata
timedMetadata :: Maybe CmfcTimedMetadata
$sel:timedMetadata:CmfcSettings' :: CmfcSettings -> Maybe CmfcTimedMetadata
timedMetadata} -> Maybe CmfcTimedMetadata
timedMetadata) (\s :: CmfcSettings
s@CmfcSettings' {} Maybe CmfcTimedMetadata
a -> CmfcSettings
s {$sel:timedMetadata:CmfcSettings' :: Maybe CmfcTimedMetadata
timedMetadata = Maybe CmfcTimedMetadata
a} :: CmfcSettings)

-- | Specify the event message box (eMSG) version for ID3 timed metadata in
-- your output. For more information, see ISO\/IEC 23009-1:2022 section
-- 5.10.3.3.3 Syntax. Leave blank to use the default value Version 0. When
-- you specify Version 1, you must also set ID3 metadata (timedMetadata) to
-- Passthrough.
cmfcSettings_timedMetadataBoxVersion :: Lens.Lens' CmfcSettings (Prelude.Maybe CmfcTimedMetadataBoxVersion)
cmfcSettings_timedMetadataBoxVersion :: Lens' CmfcSettings (Maybe CmfcTimedMetadataBoxVersion)
cmfcSettings_timedMetadataBoxVersion = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CmfcSettings' {Maybe CmfcTimedMetadataBoxVersion
timedMetadataBoxVersion :: Maybe CmfcTimedMetadataBoxVersion
$sel:timedMetadataBoxVersion:CmfcSettings' :: CmfcSettings -> Maybe CmfcTimedMetadataBoxVersion
timedMetadataBoxVersion} -> Maybe CmfcTimedMetadataBoxVersion
timedMetadataBoxVersion) (\s :: CmfcSettings
s@CmfcSettings' {} Maybe CmfcTimedMetadataBoxVersion
a -> CmfcSettings
s {$sel:timedMetadataBoxVersion:CmfcSettings' :: Maybe CmfcTimedMetadataBoxVersion
timedMetadataBoxVersion = Maybe CmfcTimedMetadataBoxVersion
a} :: CmfcSettings)

-- | Specify the event message box (eMSG) scheme ID URI (scheme_id_uri) for
-- ID3 timed metadata in your output. For more informaiton, see ISO\/IEC
-- 23009-1:2022 section 5.10.3.3.4 Semantics. Leave blank to use the
-- default value: https:\/\/aomedia.org\/emsg\/ID3 When you specify a value
-- for ID3 metadata scheme ID URI, you must also set ID3 metadata
-- (timedMetadata) to Passthrough.
cmfcSettings_timedMetadataSchemeIdUri :: Lens.Lens' CmfcSettings (Prelude.Maybe Prelude.Text)
cmfcSettings_timedMetadataSchemeIdUri :: Lens' CmfcSettings (Maybe Text)
cmfcSettings_timedMetadataSchemeIdUri = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CmfcSettings' {Maybe Text
timedMetadataSchemeIdUri :: Maybe Text
$sel:timedMetadataSchemeIdUri:CmfcSettings' :: CmfcSettings -> Maybe Text
timedMetadataSchemeIdUri} -> Maybe Text
timedMetadataSchemeIdUri) (\s :: CmfcSettings
s@CmfcSettings' {} Maybe Text
a -> CmfcSettings
s {$sel:timedMetadataSchemeIdUri:CmfcSettings' :: Maybe Text
timedMetadataSchemeIdUri = Maybe Text
a} :: CmfcSettings)

-- | Specify the event message box (eMSG) value for ID3 timed metadata in
-- your output. For more informaiton, see ISO\/IEC 23009-1:2022 section
-- 5.10.3.3.4 Semantics. When you specify a value for ID3 Metadata Value,
-- you must also set ID3 metadata (timedMetadata) to Passthrough.
cmfcSettings_timedMetadataValue :: Lens.Lens' CmfcSettings (Prelude.Maybe Prelude.Text)
cmfcSettings_timedMetadataValue :: Lens' CmfcSettings (Maybe Text)
cmfcSettings_timedMetadataValue = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CmfcSettings' {Maybe Text
timedMetadataValue :: Maybe Text
$sel:timedMetadataValue:CmfcSettings' :: CmfcSettings -> Maybe Text
timedMetadataValue} -> Maybe Text
timedMetadataValue) (\s :: CmfcSettings
s@CmfcSettings' {} Maybe Text
a -> CmfcSettings
s {$sel:timedMetadataValue:CmfcSettings' :: Maybe Text
timedMetadataValue = Maybe Text
a} :: CmfcSettings)

instance Data.FromJSON CmfcSettings where
  parseJSON :: Value -> Parser CmfcSettings
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"CmfcSettings"
      ( \Object
x ->
          Maybe CmfcAudioDuration
-> Maybe Text
-> Maybe Text
-> Maybe CmfcAudioTrackType
-> Maybe CmfcDescriptiveVideoServiceFlag
-> Maybe CmfcIFrameOnlyManifest
-> Maybe CmfcKlvMetadata
-> Maybe CmfcManifestMetadataSignaling
-> Maybe CmfcScte35Esam
-> Maybe CmfcScte35Source
-> Maybe CmfcTimedMetadata
-> Maybe CmfcTimedMetadataBoxVersion
-> Maybe Text
-> Maybe Text
-> CmfcSettings
CmfcSettings'
            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
"audioDuration")
            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
"audioGroupId")
            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
"audioRenditionSets")
            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
"audioTrackType")
            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
"descriptiveVideoServiceFlag")
            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
"iFrameOnlyManifest")
            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
"klvMetadata")
            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
"manifestMetadataSignaling")
            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
"scte35Esam")
            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
"scte35Source")
            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
"timedMetadata")
            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
"timedMetadataBoxVersion")
            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
"timedMetadataSchemeIdUri")
            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
"timedMetadataValue")
      )

instance Prelude.Hashable CmfcSettings where
  hashWithSalt :: Int -> CmfcSettings -> Int
hashWithSalt Int
_salt CmfcSettings' {Maybe Text
Maybe CmfcAudioDuration
Maybe CmfcAudioTrackType
Maybe CmfcDescriptiveVideoServiceFlag
Maybe CmfcIFrameOnlyManifest
Maybe CmfcKlvMetadata
Maybe CmfcManifestMetadataSignaling
Maybe CmfcScte35Esam
Maybe CmfcScte35Source
Maybe CmfcTimedMetadata
Maybe CmfcTimedMetadataBoxVersion
timedMetadataValue :: Maybe Text
timedMetadataSchemeIdUri :: Maybe Text
timedMetadataBoxVersion :: Maybe CmfcTimedMetadataBoxVersion
timedMetadata :: Maybe CmfcTimedMetadata
scte35Source :: Maybe CmfcScte35Source
scte35Esam :: Maybe CmfcScte35Esam
manifestMetadataSignaling :: Maybe CmfcManifestMetadataSignaling
klvMetadata :: Maybe CmfcKlvMetadata
iFrameOnlyManifest :: Maybe CmfcIFrameOnlyManifest
descriptiveVideoServiceFlag :: Maybe CmfcDescriptiveVideoServiceFlag
audioTrackType :: Maybe CmfcAudioTrackType
audioRenditionSets :: Maybe Text
audioGroupId :: Maybe Text
audioDuration :: Maybe CmfcAudioDuration
$sel:timedMetadataValue:CmfcSettings' :: CmfcSettings -> Maybe Text
$sel:timedMetadataSchemeIdUri:CmfcSettings' :: CmfcSettings -> Maybe Text
$sel:timedMetadataBoxVersion:CmfcSettings' :: CmfcSettings -> Maybe CmfcTimedMetadataBoxVersion
$sel:timedMetadata:CmfcSettings' :: CmfcSettings -> Maybe CmfcTimedMetadata
$sel:scte35Source:CmfcSettings' :: CmfcSettings -> Maybe CmfcScte35Source
$sel:scte35Esam:CmfcSettings' :: CmfcSettings -> Maybe CmfcScte35Esam
$sel:manifestMetadataSignaling:CmfcSettings' :: CmfcSettings -> Maybe CmfcManifestMetadataSignaling
$sel:klvMetadata:CmfcSettings' :: CmfcSettings -> Maybe CmfcKlvMetadata
$sel:iFrameOnlyManifest:CmfcSettings' :: CmfcSettings -> Maybe CmfcIFrameOnlyManifest
$sel:descriptiveVideoServiceFlag:CmfcSettings' :: CmfcSettings -> Maybe CmfcDescriptiveVideoServiceFlag
$sel:audioTrackType:CmfcSettings' :: CmfcSettings -> Maybe CmfcAudioTrackType
$sel:audioRenditionSets:CmfcSettings' :: CmfcSettings -> Maybe Text
$sel:audioGroupId:CmfcSettings' :: CmfcSettings -> Maybe Text
$sel:audioDuration:CmfcSettings' :: CmfcSettings -> Maybe CmfcAudioDuration
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe CmfcAudioDuration
audioDuration
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
audioGroupId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
audioRenditionSets
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe CmfcAudioTrackType
audioTrackType
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe CmfcDescriptiveVideoServiceFlag
descriptiveVideoServiceFlag
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe CmfcIFrameOnlyManifest
iFrameOnlyManifest
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe CmfcKlvMetadata
klvMetadata
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe CmfcManifestMetadataSignaling
manifestMetadataSignaling
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe CmfcScte35Esam
scte35Esam
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe CmfcScte35Source
scte35Source
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe CmfcTimedMetadata
timedMetadata
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe CmfcTimedMetadataBoxVersion
timedMetadataBoxVersion
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
timedMetadataSchemeIdUri
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
timedMetadataValue

instance Prelude.NFData CmfcSettings where
  rnf :: CmfcSettings -> ()
rnf CmfcSettings' {Maybe Text
Maybe CmfcAudioDuration
Maybe CmfcAudioTrackType
Maybe CmfcDescriptiveVideoServiceFlag
Maybe CmfcIFrameOnlyManifest
Maybe CmfcKlvMetadata
Maybe CmfcManifestMetadataSignaling
Maybe CmfcScte35Esam
Maybe CmfcScte35Source
Maybe CmfcTimedMetadata
Maybe CmfcTimedMetadataBoxVersion
timedMetadataValue :: Maybe Text
timedMetadataSchemeIdUri :: Maybe Text
timedMetadataBoxVersion :: Maybe CmfcTimedMetadataBoxVersion
timedMetadata :: Maybe CmfcTimedMetadata
scte35Source :: Maybe CmfcScte35Source
scte35Esam :: Maybe CmfcScte35Esam
manifestMetadataSignaling :: Maybe CmfcManifestMetadataSignaling
klvMetadata :: Maybe CmfcKlvMetadata
iFrameOnlyManifest :: Maybe CmfcIFrameOnlyManifest
descriptiveVideoServiceFlag :: Maybe CmfcDescriptiveVideoServiceFlag
audioTrackType :: Maybe CmfcAudioTrackType
audioRenditionSets :: Maybe Text
audioGroupId :: Maybe Text
audioDuration :: Maybe CmfcAudioDuration
$sel:timedMetadataValue:CmfcSettings' :: CmfcSettings -> Maybe Text
$sel:timedMetadataSchemeIdUri:CmfcSettings' :: CmfcSettings -> Maybe Text
$sel:timedMetadataBoxVersion:CmfcSettings' :: CmfcSettings -> Maybe CmfcTimedMetadataBoxVersion
$sel:timedMetadata:CmfcSettings' :: CmfcSettings -> Maybe CmfcTimedMetadata
$sel:scte35Source:CmfcSettings' :: CmfcSettings -> Maybe CmfcScte35Source
$sel:scte35Esam:CmfcSettings' :: CmfcSettings -> Maybe CmfcScte35Esam
$sel:manifestMetadataSignaling:CmfcSettings' :: CmfcSettings -> Maybe CmfcManifestMetadataSignaling
$sel:klvMetadata:CmfcSettings' :: CmfcSettings -> Maybe CmfcKlvMetadata
$sel:iFrameOnlyManifest:CmfcSettings' :: CmfcSettings -> Maybe CmfcIFrameOnlyManifest
$sel:descriptiveVideoServiceFlag:CmfcSettings' :: CmfcSettings -> Maybe CmfcDescriptiveVideoServiceFlag
$sel:audioTrackType:CmfcSettings' :: CmfcSettings -> Maybe CmfcAudioTrackType
$sel:audioRenditionSets:CmfcSettings' :: CmfcSettings -> Maybe Text
$sel:audioGroupId:CmfcSettings' :: CmfcSettings -> Maybe Text
$sel:audioDuration:CmfcSettings' :: CmfcSettings -> Maybe CmfcAudioDuration
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe CmfcAudioDuration
audioDuration
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
audioGroupId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
audioRenditionSets
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe CmfcAudioTrackType
audioTrackType
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe CmfcDescriptiveVideoServiceFlag
descriptiveVideoServiceFlag
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe CmfcIFrameOnlyManifest
iFrameOnlyManifest
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe CmfcKlvMetadata
klvMetadata
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe CmfcManifestMetadataSignaling
manifestMetadataSignaling
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe CmfcScte35Esam
scte35Esam
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe CmfcScte35Source
scte35Source
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe CmfcTimedMetadata
timedMetadata
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe CmfcTimedMetadataBoxVersion
timedMetadataBoxVersion
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
timedMetadataSchemeIdUri
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
timedMetadataValue

instance Data.ToJSON CmfcSettings where
  toJSON :: CmfcSettings -> Value
toJSON CmfcSettings' {Maybe Text
Maybe CmfcAudioDuration
Maybe CmfcAudioTrackType
Maybe CmfcDescriptiveVideoServiceFlag
Maybe CmfcIFrameOnlyManifest
Maybe CmfcKlvMetadata
Maybe CmfcManifestMetadataSignaling
Maybe CmfcScte35Esam
Maybe CmfcScte35Source
Maybe CmfcTimedMetadata
Maybe CmfcTimedMetadataBoxVersion
timedMetadataValue :: Maybe Text
timedMetadataSchemeIdUri :: Maybe Text
timedMetadataBoxVersion :: Maybe CmfcTimedMetadataBoxVersion
timedMetadata :: Maybe CmfcTimedMetadata
scte35Source :: Maybe CmfcScte35Source
scte35Esam :: Maybe CmfcScte35Esam
manifestMetadataSignaling :: Maybe CmfcManifestMetadataSignaling
klvMetadata :: Maybe CmfcKlvMetadata
iFrameOnlyManifest :: Maybe CmfcIFrameOnlyManifest
descriptiveVideoServiceFlag :: Maybe CmfcDescriptiveVideoServiceFlag
audioTrackType :: Maybe CmfcAudioTrackType
audioRenditionSets :: Maybe Text
audioGroupId :: Maybe Text
audioDuration :: Maybe CmfcAudioDuration
$sel:timedMetadataValue:CmfcSettings' :: CmfcSettings -> Maybe Text
$sel:timedMetadataSchemeIdUri:CmfcSettings' :: CmfcSettings -> Maybe Text
$sel:timedMetadataBoxVersion:CmfcSettings' :: CmfcSettings -> Maybe CmfcTimedMetadataBoxVersion
$sel:timedMetadata:CmfcSettings' :: CmfcSettings -> Maybe CmfcTimedMetadata
$sel:scte35Source:CmfcSettings' :: CmfcSettings -> Maybe CmfcScte35Source
$sel:scte35Esam:CmfcSettings' :: CmfcSettings -> Maybe CmfcScte35Esam
$sel:manifestMetadataSignaling:CmfcSettings' :: CmfcSettings -> Maybe CmfcManifestMetadataSignaling
$sel:klvMetadata:CmfcSettings' :: CmfcSettings -> Maybe CmfcKlvMetadata
$sel:iFrameOnlyManifest:CmfcSettings' :: CmfcSettings -> Maybe CmfcIFrameOnlyManifest
$sel:descriptiveVideoServiceFlag:CmfcSettings' :: CmfcSettings -> Maybe CmfcDescriptiveVideoServiceFlag
$sel:audioTrackType:CmfcSettings' :: CmfcSettings -> Maybe CmfcAudioTrackType
$sel:audioRenditionSets:CmfcSettings' :: CmfcSettings -> Maybe Text
$sel:audioGroupId:CmfcSettings' :: CmfcSettings -> Maybe Text
$sel:audioDuration:CmfcSettings' :: CmfcSettings -> Maybe CmfcAudioDuration
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"audioDuration" 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 CmfcAudioDuration
audioDuration,
            (Key
"audioGroupId" 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 Text
audioGroupId,
            (Key
"audioRenditionSets" 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 Text
audioRenditionSets,
            (Key
"audioTrackType" 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 CmfcAudioTrackType
audioTrackType,
            (Key
"descriptiveVideoServiceFlag" 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 CmfcDescriptiveVideoServiceFlag
descriptiveVideoServiceFlag,
            (Key
"iFrameOnlyManifest" 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 CmfcIFrameOnlyManifest
iFrameOnlyManifest,
            (Key
"klvMetadata" 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 CmfcKlvMetadata
klvMetadata,
            (Key
"manifestMetadataSignaling" 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 CmfcManifestMetadataSignaling
manifestMetadataSignaling,
            (Key
"scte35Esam" 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 CmfcScte35Esam
scte35Esam,
            (Key
"scte35Source" 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 CmfcScte35Source
scte35Source,
            (Key
"timedMetadata" 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 CmfcTimedMetadata
timedMetadata,
            (Key
"timedMetadataBoxVersion" 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 CmfcTimedMetadataBoxVersion
timedMetadataBoxVersion,
            (Key
"timedMetadataSchemeIdUri" 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 Text
timedMetadataSchemeIdUri,
            (Key
"timedMetadataValue" 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 Text
timedMetadataValue
          ]
      )