{-# 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.FileSourceSettings
-- 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.FileSourceSettings 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.CaptionSourceFramerate
import Amazonka.MediaConvert.Types.FileSourceConvert608To708
import Amazonka.MediaConvert.Types.FileSourceTimeDeltaUnits
import qualified Amazonka.Prelude as Prelude

-- | If your input captions are SCC, SMI, SRT, STL, TTML, WebVTT, or IMSC 1.1
-- in an xml file, specify the URI of the input caption source file. If
-- your caption source is IMSC in an IMF package, use TrackSourceSettings
-- instead of FileSoureSettings.
--
-- /See:/ 'newFileSourceSettings' smart constructor.
data FileSourceSettings = FileSourceSettings'
  { -- | Specify whether this set of input captions appears in your outputs in
    -- both 608 and 708 format. If you choose Upconvert (UPCONVERT),
    -- MediaConvert includes the captions data in two ways: it passes the 608
    -- data through using the 608 compatibility bytes fields of the 708
    -- wrapper, and it also translates the 608 data into 708.
    FileSourceSettings -> Maybe FileSourceConvert608To708
convert608To708 :: Prelude.Maybe FileSourceConvert608To708,
    -- | Ignore this setting unless your input captions format is SCC. To have
    -- the service compensate for differing frame rates between your input
    -- captions and input video, specify the frame rate of the captions file.
    -- Specify this value as a fraction. When you work directly in your JSON
    -- job specification, use the settings framerateNumerator and
    -- framerateDenominator. For example, you might specify 24 \/ 1 for 24 fps,
    -- 25 \/ 1 for 25 fps, 24000 \/ 1001 for 23.976 fps, or 30000 \/ 1001 for
    -- 29.97 fps.
    FileSourceSettings -> Maybe CaptionSourceFramerate
framerate :: Prelude.Maybe CaptionSourceFramerate,
    -- | External caption file used for loading captions. Accepted file
    -- extensions are \'scc\', \'ttml\', \'dfxp\', \'stl\', \'srt\', \'xml\',
    -- \'smi\', \'webvtt\', and \'vtt\'.
    FileSourceSettings -> Maybe Text
sourceFile :: Prelude.Maybe Prelude.Text,
    -- | Optional. Use this setting when you need to adjust the sync between your
    -- sidecar captions and your video. For more information, see
    -- https:\/\/docs.aws.amazon.com\/mediaconvert\/latest\/ug\/time-delta-use-cases.html.
    -- Enter a positive or negative number to modify the times in the captions
    -- file. For example, type 15 to add 15 seconds to all the times in the
    -- captions file. Type -5 to subtract 5 seconds from the times in the
    -- captions file. You can optionally specify your time delta in
    -- milliseconds instead of seconds. When you do so, set the related
    -- setting, Time delta units (TimeDeltaUnits) to Milliseconds
    -- (MILLISECONDS). Note that, when you specify a time delta for
    -- timecode-based caption sources, such as SCC and STL, and your time delta
    -- isn\'t a multiple of the input frame rate, MediaConvert snaps the
    -- captions to the nearest frame. For example, when your input video frame
    -- rate is 25 fps and you specify 1010ms for time delta, MediaConvert
    -- delays your captions by 1000 ms.
    FileSourceSettings -> Maybe Int
timeDelta :: Prelude.Maybe Prelude.Int,
    -- | When you use the setting Time delta (TimeDelta) to adjust the sync
    -- between your sidecar captions and your video, use this setting to
    -- specify the units for the delta that you specify. When you don\'t
    -- specify a value for Time delta units (TimeDeltaUnits), MediaConvert uses
    -- seconds by default.
    FileSourceSettings -> Maybe FileSourceTimeDeltaUnits
timeDeltaUnits :: Prelude.Maybe FileSourceTimeDeltaUnits
  }
  deriving (FileSourceSettings -> FileSourceSettings -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: FileSourceSettings -> FileSourceSettings -> Bool
$c/= :: FileSourceSettings -> FileSourceSettings -> Bool
== :: FileSourceSettings -> FileSourceSettings -> Bool
$c== :: FileSourceSettings -> FileSourceSettings -> Bool
Prelude.Eq, ReadPrec [FileSourceSettings]
ReadPrec FileSourceSettings
Int -> ReadS FileSourceSettings
ReadS [FileSourceSettings]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [FileSourceSettings]
$creadListPrec :: ReadPrec [FileSourceSettings]
readPrec :: ReadPrec FileSourceSettings
$creadPrec :: ReadPrec FileSourceSettings
readList :: ReadS [FileSourceSettings]
$creadList :: ReadS [FileSourceSettings]
readsPrec :: Int -> ReadS FileSourceSettings
$creadsPrec :: Int -> ReadS FileSourceSettings
Prelude.Read, Int -> FileSourceSettings -> ShowS
[FileSourceSettings] -> ShowS
FileSourceSettings -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [FileSourceSettings] -> ShowS
$cshowList :: [FileSourceSettings] -> ShowS
show :: FileSourceSettings -> String
$cshow :: FileSourceSettings -> String
showsPrec :: Int -> FileSourceSettings -> ShowS
$cshowsPrec :: Int -> FileSourceSettings -> ShowS
Prelude.Show, forall x. Rep FileSourceSettings x -> FileSourceSettings
forall x. FileSourceSettings -> Rep FileSourceSettings x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep FileSourceSettings x -> FileSourceSettings
$cfrom :: forall x. FileSourceSettings -> Rep FileSourceSettings x
Prelude.Generic)

-- |
-- Create a value of 'FileSourceSettings' 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:
--
-- 'convert608To708', 'fileSourceSettings_convert608To708' - Specify whether this set of input captions appears in your outputs in
-- both 608 and 708 format. If you choose Upconvert (UPCONVERT),
-- MediaConvert includes the captions data in two ways: it passes the 608
-- data through using the 608 compatibility bytes fields of the 708
-- wrapper, and it also translates the 608 data into 708.
--
-- 'framerate', 'fileSourceSettings_framerate' - Ignore this setting unless your input captions format is SCC. To have
-- the service compensate for differing frame rates between your input
-- captions and input video, specify the frame rate of the captions file.
-- Specify this value as a fraction. When you work directly in your JSON
-- job specification, use the settings framerateNumerator and
-- framerateDenominator. For example, you might specify 24 \/ 1 for 24 fps,
-- 25 \/ 1 for 25 fps, 24000 \/ 1001 for 23.976 fps, or 30000 \/ 1001 for
-- 29.97 fps.
--
-- 'sourceFile', 'fileSourceSettings_sourceFile' - External caption file used for loading captions. Accepted file
-- extensions are \'scc\', \'ttml\', \'dfxp\', \'stl\', \'srt\', \'xml\',
-- \'smi\', \'webvtt\', and \'vtt\'.
--
-- 'timeDelta', 'fileSourceSettings_timeDelta' - Optional. Use this setting when you need to adjust the sync between your
-- sidecar captions and your video. For more information, see
-- https:\/\/docs.aws.amazon.com\/mediaconvert\/latest\/ug\/time-delta-use-cases.html.
-- Enter a positive or negative number to modify the times in the captions
-- file. For example, type 15 to add 15 seconds to all the times in the
-- captions file. Type -5 to subtract 5 seconds from the times in the
-- captions file. You can optionally specify your time delta in
-- milliseconds instead of seconds. When you do so, set the related
-- setting, Time delta units (TimeDeltaUnits) to Milliseconds
-- (MILLISECONDS). Note that, when you specify a time delta for
-- timecode-based caption sources, such as SCC and STL, and your time delta
-- isn\'t a multiple of the input frame rate, MediaConvert snaps the
-- captions to the nearest frame. For example, when your input video frame
-- rate is 25 fps and you specify 1010ms for time delta, MediaConvert
-- delays your captions by 1000 ms.
--
-- 'timeDeltaUnits', 'fileSourceSettings_timeDeltaUnits' - When you use the setting Time delta (TimeDelta) to adjust the sync
-- between your sidecar captions and your video, use this setting to
-- specify the units for the delta that you specify. When you don\'t
-- specify a value for Time delta units (TimeDeltaUnits), MediaConvert uses
-- seconds by default.
newFileSourceSettings ::
  FileSourceSettings
newFileSourceSettings :: FileSourceSettings
newFileSourceSettings =
  FileSourceSettings'
    { $sel:convert608To708:FileSourceSettings' :: Maybe FileSourceConvert608To708
convert608To708 =
        forall a. Maybe a
Prelude.Nothing,
      $sel:framerate:FileSourceSettings' :: Maybe CaptionSourceFramerate
framerate = forall a. Maybe a
Prelude.Nothing,
      $sel:sourceFile:FileSourceSettings' :: Maybe Text
sourceFile = forall a. Maybe a
Prelude.Nothing,
      $sel:timeDelta:FileSourceSettings' :: Maybe Int
timeDelta = forall a. Maybe a
Prelude.Nothing,
      $sel:timeDeltaUnits:FileSourceSettings' :: Maybe FileSourceTimeDeltaUnits
timeDeltaUnits = forall a. Maybe a
Prelude.Nothing
    }

-- | Specify whether this set of input captions appears in your outputs in
-- both 608 and 708 format. If you choose Upconvert (UPCONVERT),
-- MediaConvert includes the captions data in two ways: it passes the 608
-- data through using the 608 compatibility bytes fields of the 708
-- wrapper, and it also translates the 608 data into 708.
fileSourceSettings_convert608To708 :: Lens.Lens' FileSourceSettings (Prelude.Maybe FileSourceConvert608To708)
fileSourceSettings_convert608To708 :: Lens' FileSourceSettings (Maybe FileSourceConvert608To708)
fileSourceSettings_convert608To708 = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\FileSourceSettings' {Maybe FileSourceConvert608To708
convert608To708 :: Maybe FileSourceConvert608To708
$sel:convert608To708:FileSourceSettings' :: FileSourceSettings -> Maybe FileSourceConvert608To708
convert608To708} -> Maybe FileSourceConvert608To708
convert608To708) (\s :: FileSourceSettings
s@FileSourceSettings' {} Maybe FileSourceConvert608To708
a -> FileSourceSettings
s {$sel:convert608To708:FileSourceSettings' :: Maybe FileSourceConvert608To708
convert608To708 = Maybe FileSourceConvert608To708
a} :: FileSourceSettings)

-- | Ignore this setting unless your input captions format is SCC. To have
-- the service compensate for differing frame rates between your input
-- captions and input video, specify the frame rate of the captions file.
-- Specify this value as a fraction. When you work directly in your JSON
-- job specification, use the settings framerateNumerator and
-- framerateDenominator. For example, you might specify 24 \/ 1 for 24 fps,
-- 25 \/ 1 for 25 fps, 24000 \/ 1001 for 23.976 fps, or 30000 \/ 1001 for
-- 29.97 fps.
fileSourceSettings_framerate :: Lens.Lens' FileSourceSettings (Prelude.Maybe CaptionSourceFramerate)
fileSourceSettings_framerate :: Lens' FileSourceSettings (Maybe CaptionSourceFramerate)
fileSourceSettings_framerate = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\FileSourceSettings' {Maybe CaptionSourceFramerate
framerate :: Maybe CaptionSourceFramerate
$sel:framerate:FileSourceSettings' :: FileSourceSettings -> Maybe CaptionSourceFramerate
framerate} -> Maybe CaptionSourceFramerate
framerate) (\s :: FileSourceSettings
s@FileSourceSettings' {} Maybe CaptionSourceFramerate
a -> FileSourceSettings
s {$sel:framerate:FileSourceSettings' :: Maybe CaptionSourceFramerate
framerate = Maybe CaptionSourceFramerate
a} :: FileSourceSettings)

-- | External caption file used for loading captions. Accepted file
-- extensions are \'scc\', \'ttml\', \'dfxp\', \'stl\', \'srt\', \'xml\',
-- \'smi\', \'webvtt\', and \'vtt\'.
fileSourceSettings_sourceFile :: Lens.Lens' FileSourceSettings (Prelude.Maybe Prelude.Text)
fileSourceSettings_sourceFile :: Lens' FileSourceSettings (Maybe Text)
fileSourceSettings_sourceFile = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\FileSourceSettings' {Maybe Text
sourceFile :: Maybe Text
$sel:sourceFile:FileSourceSettings' :: FileSourceSettings -> Maybe Text
sourceFile} -> Maybe Text
sourceFile) (\s :: FileSourceSettings
s@FileSourceSettings' {} Maybe Text
a -> FileSourceSettings
s {$sel:sourceFile:FileSourceSettings' :: Maybe Text
sourceFile = Maybe Text
a} :: FileSourceSettings)

-- | Optional. Use this setting when you need to adjust the sync between your
-- sidecar captions and your video. For more information, see
-- https:\/\/docs.aws.amazon.com\/mediaconvert\/latest\/ug\/time-delta-use-cases.html.
-- Enter a positive or negative number to modify the times in the captions
-- file. For example, type 15 to add 15 seconds to all the times in the
-- captions file. Type -5 to subtract 5 seconds from the times in the
-- captions file. You can optionally specify your time delta in
-- milliseconds instead of seconds. When you do so, set the related
-- setting, Time delta units (TimeDeltaUnits) to Milliseconds
-- (MILLISECONDS). Note that, when you specify a time delta for
-- timecode-based caption sources, such as SCC and STL, and your time delta
-- isn\'t a multiple of the input frame rate, MediaConvert snaps the
-- captions to the nearest frame. For example, when your input video frame
-- rate is 25 fps and you specify 1010ms for time delta, MediaConvert
-- delays your captions by 1000 ms.
fileSourceSettings_timeDelta :: Lens.Lens' FileSourceSettings (Prelude.Maybe Prelude.Int)
fileSourceSettings_timeDelta :: Lens' FileSourceSettings (Maybe Int)
fileSourceSettings_timeDelta = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\FileSourceSettings' {Maybe Int
timeDelta :: Maybe Int
$sel:timeDelta:FileSourceSettings' :: FileSourceSettings -> Maybe Int
timeDelta} -> Maybe Int
timeDelta) (\s :: FileSourceSettings
s@FileSourceSettings' {} Maybe Int
a -> FileSourceSettings
s {$sel:timeDelta:FileSourceSettings' :: Maybe Int
timeDelta = Maybe Int
a} :: FileSourceSettings)

-- | When you use the setting Time delta (TimeDelta) to adjust the sync
-- between your sidecar captions and your video, use this setting to
-- specify the units for the delta that you specify. When you don\'t
-- specify a value for Time delta units (TimeDeltaUnits), MediaConvert uses
-- seconds by default.
fileSourceSettings_timeDeltaUnits :: Lens.Lens' FileSourceSettings (Prelude.Maybe FileSourceTimeDeltaUnits)
fileSourceSettings_timeDeltaUnits :: Lens' FileSourceSettings (Maybe FileSourceTimeDeltaUnits)
fileSourceSettings_timeDeltaUnits = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\FileSourceSettings' {Maybe FileSourceTimeDeltaUnits
timeDeltaUnits :: Maybe FileSourceTimeDeltaUnits
$sel:timeDeltaUnits:FileSourceSettings' :: FileSourceSettings -> Maybe FileSourceTimeDeltaUnits
timeDeltaUnits} -> Maybe FileSourceTimeDeltaUnits
timeDeltaUnits) (\s :: FileSourceSettings
s@FileSourceSettings' {} Maybe FileSourceTimeDeltaUnits
a -> FileSourceSettings
s {$sel:timeDeltaUnits:FileSourceSettings' :: Maybe FileSourceTimeDeltaUnits
timeDeltaUnits = Maybe FileSourceTimeDeltaUnits
a} :: FileSourceSettings)

instance Data.FromJSON FileSourceSettings where
  parseJSON :: Value -> Parser FileSourceSettings
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"FileSourceSettings"
      ( \Object
x ->
          Maybe FileSourceConvert608To708
-> Maybe CaptionSourceFramerate
-> Maybe Text
-> Maybe Int
-> Maybe FileSourceTimeDeltaUnits
-> FileSourceSettings
FileSourceSettings'
            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
"convert608To708")
            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
"framerate")
            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
"sourceFile")
            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
"timeDelta")
            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
"timeDeltaUnits")
      )

instance Prelude.Hashable FileSourceSettings where
  hashWithSalt :: Int -> FileSourceSettings -> Int
hashWithSalt Int
_salt FileSourceSettings' {Maybe Int
Maybe Text
Maybe CaptionSourceFramerate
Maybe FileSourceConvert608To708
Maybe FileSourceTimeDeltaUnits
timeDeltaUnits :: Maybe FileSourceTimeDeltaUnits
timeDelta :: Maybe Int
sourceFile :: Maybe Text
framerate :: Maybe CaptionSourceFramerate
convert608To708 :: Maybe FileSourceConvert608To708
$sel:timeDeltaUnits:FileSourceSettings' :: FileSourceSettings -> Maybe FileSourceTimeDeltaUnits
$sel:timeDelta:FileSourceSettings' :: FileSourceSettings -> Maybe Int
$sel:sourceFile:FileSourceSettings' :: FileSourceSettings -> Maybe Text
$sel:framerate:FileSourceSettings' :: FileSourceSettings -> Maybe CaptionSourceFramerate
$sel:convert608To708:FileSourceSettings' :: FileSourceSettings -> Maybe FileSourceConvert608To708
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe FileSourceConvert608To708
convert608To708
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe CaptionSourceFramerate
framerate
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
sourceFile
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
timeDelta
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe FileSourceTimeDeltaUnits
timeDeltaUnits

instance Prelude.NFData FileSourceSettings where
  rnf :: FileSourceSettings -> ()
rnf FileSourceSettings' {Maybe Int
Maybe Text
Maybe CaptionSourceFramerate
Maybe FileSourceConvert608To708
Maybe FileSourceTimeDeltaUnits
timeDeltaUnits :: Maybe FileSourceTimeDeltaUnits
timeDelta :: Maybe Int
sourceFile :: Maybe Text
framerate :: Maybe CaptionSourceFramerate
convert608To708 :: Maybe FileSourceConvert608To708
$sel:timeDeltaUnits:FileSourceSettings' :: FileSourceSettings -> Maybe FileSourceTimeDeltaUnits
$sel:timeDelta:FileSourceSettings' :: FileSourceSettings -> Maybe Int
$sel:sourceFile:FileSourceSettings' :: FileSourceSettings -> Maybe Text
$sel:framerate:FileSourceSettings' :: FileSourceSettings -> Maybe CaptionSourceFramerate
$sel:convert608To708:FileSourceSettings' :: FileSourceSettings -> Maybe FileSourceConvert608To708
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe FileSourceConvert608To708
convert608To708
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe CaptionSourceFramerate
framerate
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
sourceFile
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
timeDelta
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe FileSourceTimeDeltaUnits
timeDeltaUnits

instance Data.ToJSON FileSourceSettings where
  toJSON :: FileSourceSettings -> Value
toJSON FileSourceSettings' {Maybe Int
Maybe Text
Maybe CaptionSourceFramerate
Maybe FileSourceConvert608To708
Maybe FileSourceTimeDeltaUnits
timeDeltaUnits :: Maybe FileSourceTimeDeltaUnits
timeDelta :: Maybe Int
sourceFile :: Maybe Text
framerate :: Maybe CaptionSourceFramerate
convert608To708 :: Maybe FileSourceConvert608To708
$sel:timeDeltaUnits:FileSourceSettings' :: FileSourceSettings -> Maybe FileSourceTimeDeltaUnits
$sel:timeDelta:FileSourceSettings' :: FileSourceSettings -> Maybe Int
$sel:sourceFile:FileSourceSettings' :: FileSourceSettings -> Maybe Text
$sel:framerate:FileSourceSettings' :: FileSourceSettings -> Maybe CaptionSourceFramerate
$sel:convert608To708:FileSourceSettings' :: FileSourceSettings -> Maybe FileSourceConvert608To708
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"convert608To708" 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 FileSourceConvert608To708
convert608To708,
            (Key
"framerate" 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 CaptionSourceFramerate
framerate,
            (Key
"sourceFile" 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
sourceFile,
            (Key
"timeDelta" 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 Int
timeDelta,
            (Key
"timeDeltaUnits" 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 FileSourceTimeDeltaUnits
timeDeltaUnits
          ]
      )