{-# 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.BurninDestinationSettings
-- 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.BurninDestinationSettings 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.BurnInSubtitleStylePassthrough
import Amazonka.MediaConvert.Types.BurninSubtitleAlignment
import Amazonka.MediaConvert.Types.BurninSubtitleApplyFontColor
import Amazonka.MediaConvert.Types.BurninSubtitleBackgroundColor
import Amazonka.MediaConvert.Types.BurninSubtitleFallbackFont
import Amazonka.MediaConvert.Types.BurninSubtitleFontColor
import Amazonka.MediaConvert.Types.BurninSubtitleOutlineColor
import Amazonka.MediaConvert.Types.BurninSubtitleShadowColor
import Amazonka.MediaConvert.Types.BurninSubtitleTeletextSpacing
import Amazonka.MediaConvert.Types.FontScript
import qualified Amazonka.Prelude as Prelude

-- | Burn-in is a captions delivery method, rather than a captions format.
-- Burn-in writes the captions directly on your video frames, replacing
-- pixels of video content with the captions. Set up burn-in captions in
-- the same output as your video. For more information, see
-- https:\/\/docs.aws.amazon.com\/mediaconvert\/latest\/ug\/burn-in-output-captions.html.
-- When you work directly in your JSON job specification, include this
-- object and any required children when you set destinationType to
-- BURN_IN.
--
-- /See:/ 'newBurninDestinationSettings' smart constructor.
data BurninDestinationSettings = BurninDestinationSettings'
  { -- | Specify the alignment of your captions. If no explicit x_position is
    -- provided, setting alignment to centered will placethe captions at the
    -- bottom center of the output. Similarly, setting a left alignment
    -- willalign captions to the bottom left of the output. If x and y
    -- positions are given in conjunction with the alignment parameter, the
    -- font will be justified (either left or centered) relative to those
    -- coordinates.
    BurninDestinationSettings -> Maybe BurninSubtitleAlignment
alignment :: Prelude.Maybe BurninSubtitleAlignment,
    -- | Ignore this setting unless Style passthrough (StylePassthrough) is set
    -- to Enabled and Font color (FontColor) set to Black, Yellow, Red, Green,
    -- Blue, or Hex. Use Apply font color (ApplyFontColor) for additional font
    -- color controls. When you choose White text only (WHITE_TEXT_ONLY), or
    -- leave blank, your font color setting only applies to white text in your
    -- input captions. For example, if your font color setting is Yellow, and
    -- your input captions have red and white text, your output captions will
    -- have red and yellow text. When you choose ALL_TEXT, your font color
    -- setting applies to all of your output captions text.
    BurninDestinationSettings -> Maybe BurninSubtitleApplyFontColor
applyFontColor :: Prelude.Maybe BurninSubtitleApplyFontColor,
    -- | Specify the color of the rectangle behind the captions. Leave background
    -- color (BackgroundColor) blank and set Style passthrough
    -- (StylePassthrough) to enabled to use the background color data from your
    -- input captions, if present.
    BurninDestinationSettings -> Maybe BurninSubtitleBackgroundColor
backgroundColor :: Prelude.Maybe BurninSubtitleBackgroundColor,
    -- | Specify the opacity of the background rectangle. Enter a value from 0 to
    -- 255, where 0 is transparent and 255 is opaque. If Style passthrough
    -- (StylePassthrough) is set to enabled, leave blank to pass through the
    -- background style information in your input captions to your output
    -- captions. If Style passthrough is set to disabled, leave blank to use a
    -- value of 0 and remove all backgrounds from your output captions.
    BurninDestinationSettings -> Maybe Natural
backgroundOpacity :: Prelude.Maybe Prelude.Natural,
    -- | Specify the font that you want the service to use for your burn in
    -- captions when your input captions specify a font that MediaConvert
    -- doesn\'t support. When you set Fallback font (FallbackFont) to best
    -- match (BEST_MATCH), or leave blank, MediaConvert uses a supported font
    -- that most closely matches the font that your input captions specify.
    -- When there are multiple unsupported fonts in your input captions,
    -- MediaConvert matches each font with the supported font that matches
    -- best. When you explicitly choose a replacement font, MediaConvert uses
    -- that font to replace all unsupported fonts from your input.
    BurninDestinationSettings -> Maybe BurninSubtitleFallbackFont
fallbackFont :: Prelude.Maybe BurninSubtitleFallbackFont,
    -- | Specify the color of the burned-in captions text. Leave Font color
    -- (FontColor) blank and set Style passthrough (StylePassthrough) to
    -- enabled to use the font color data from your input captions, if present.
    BurninDestinationSettings -> Maybe BurninSubtitleFontColor
fontColor :: Prelude.Maybe BurninSubtitleFontColor,
    -- | Specify the opacity of the burned-in captions. 255 is opaque; 0 is
    -- transparent.
    BurninDestinationSettings -> Maybe Natural
fontOpacity :: Prelude.Maybe Prelude.Natural,
    -- | Specify the Font resolution (FontResolution) in DPI (dots per inch).
    BurninDestinationSettings -> Maybe Natural
fontResolution :: Prelude.Maybe Prelude.Natural,
    -- | Set Font script (FontScript) to Automatically determined (AUTOMATIC), or
    -- leave blank, to automatically determine the font script in your input
    -- captions. Otherwise, set to Simplified Chinese (HANS) or Traditional
    -- Chinese (HANT) if your input font script uses Simplified or Traditional
    -- Chinese.
    BurninDestinationSettings -> Maybe FontScript
fontScript :: Prelude.Maybe FontScript,
    -- | Specify the Font size (FontSize) in pixels. Must be a positive integer.
    -- Set to 0, or leave blank, for automatic font size.
    BurninDestinationSettings -> Maybe Natural
fontSize :: Prelude.Maybe Prelude.Natural,
    -- | Ignore this setting unless your Font color is set to Hex. Enter either
    -- six or eight hexidecimal digits, representing red, green, and blue, with
    -- two optional extra digits for alpha. For example a value of 1122AABB is
    -- a red value of 0x11, a green value of 0x22, a blue value of 0xAA, and an
    -- alpha value of 0xBB.
    BurninDestinationSettings -> Maybe Text
hexFontColor :: Prelude.Maybe Prelude.Text,
    -- | Specify font outline color. Leave Outline color (OutlineColor) blank and
    -- set Style passthrough (StylePassthrough) to enabled to use the font
    -- outline color data from your input captions, if present.
    BurninDestinationSettings -> Maybe BurninSubtitleOutlineColor
outlineColor :: Prelude.Maybe BurninSubtitleOutlineColor,
    -- | Specify the Outline size (OutlineSize) of the caption text, in pixels.
    -- Leave Outline size blank and set Style passthrough (StylePassthrough) to
    -- enabled to use the outline size data from your input captions, if
    -- present.
    BurninDestinationSettings -> Maybe Natural
outlineSize :: Prelude.Maybe Prelude.Natural,
    -- | Specify the color of the shadow cast by the captions. Leave Shadow color
    -- (ShadowColor) blank and set Style passthrough (StylePassthrough) to
    -- enabled to use the shadow color data from your input captions, if
    -- present.
    BurninDestinationSettings -> Maybe BurninSubtitleShadowColor
shadowColor :: Prelude.Maybe BurninSubtitleShadowColor,
    -- | Specify the opacity of the shadow. Enter a value from 0 to 255, where 0
    -- is transparent and 255 is opaque. If Style passthrough
    -- (StylePassthrough) is set to Enabled, leave Shadow opacity
    -- (ShadowOpacity) blank to pass through the shadow style information in
    -- your input captions to your output captions. If Style passthrough is set
    -- to disabled, leave blank to use a value of 0 and remove all shadows from
    -- your output captions.
    BurninDestinationSettings -> Maybe Natural
shadowOpacity :: Prelude.Maybe Prelude.Natural,
    -- | Specify the horizontal offset of the shadow, relative to the captions in
    -- pixels. A value of -2 would result in a shadow offset 2 pixels to the
    -- left.
    BurninDestinationSettings -> Maybe Int
shadowXOffset :: Prelude.Maybe Prelude.Int,
    -- | Specify the vertical offset of the shadow relative to the captions in
    -- pixels. A value of -2 would result in a shadow offset 2 pixels above the
    -- text. Leave Shadow y-offset (ShadowYOffset) blank and set Style
    -- passthrough (StylePassthrough) to enabled to use the shadow y-offset
    -- data from your input captions, if present.
    BurninDestinationSettings -> Maybe Int
shadowYOffset :: Prelude.Maybe Prelude.Int,
    -- | Set Style passthrough (StylePassthrough) to ENABLED to use the available
    -- style, color, and position information from your input captions.
    -- MediaConvert uses default settings for any missing style and position
    -- information in your input captions. Set Style passthrough to DISABLED,
    -- or leave blank, to ignore the style and position information from your
    -- input captions and use default settings: white text with black
    -- outlining, bottom-center positioning, and automatic sizing. Whether you
    -- set Style passthrough to enabled or not, you can also choose to manually
    -- override any of the individual style and position settings.
    BurninDestinationSettings -> Maybe BurnInSubtitleStylePassthrough
stylePassthrough :: Prelude.Maybe BurnInSubtitleStylePassthrough,
    -- | Specify whether the text spacing (TeletextSpacing) in your captions is
    -- set by the captions grid, or varies depending on letter width. Choose
    -- fixed grid (FIXED_GRID) to conform to the spacing specified in the
    -- captions file more accurately. Choose proportional (PROPORTIONAL) to
    -- make the text easier to read for closed captions.
    BurninDestinationSettings -> Maybe BurninSubtitleTeletextSpacing
teletextSpacing :: Prelude.Maybe BurninSubtitleTeletextSpacing,
    -- | Specify the horizontal position (XPosition) of the captions, relative to
    -- the left side of the output in pixels. A value of 10 would result in the
    -- captions starting 10 pixels from the left of the output. If no explicit
    -- x_position is provided, the horizontal caption position will be
    -- determined by the alignment parameter.
    BurninDestinationSettings -> Maybe Natural
xPosition :: Prelude.Maybe Prelude.Natural,
    -- | Specify the vertical position (YPosition) of the captions, relative to
    -- the top of the output in pixels. A value of 10 would result in the
    -- captions starting 10 pixels from the top of the output. If no explicit
    -- y_position is provided, the caption will be positioned towards the
    -- bottom of the output.
    BurninDestinationSettings -> Maybe Natural
yPosition :: Prelude.Maybe Prelude.Natural
  }
  deriving (BurninDestinationSettings -> BurninDestinationSettings -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: BurninDestinationSettings -> BurninDestinationSettings -> Bool
$c/= :: BurninDestinationSettings -> BurninDestinationSettings -> Bool
== :: BurninDestinationSettings -> BurninDestinationSettings -> Bool
$c== :: BurninDestinationSettings -> BurninDestinationSettings -> Bool
Prelude.Eq, ReadPrec [BurninDestinationSettings]
ReadPrec BurninDestinationSettings
Int -> ReadS BurninDestinationSettings
ReadS [BurninDestinationSettings]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [BurninDestinationSettings]
$creadListPrec :: ReadPrec [BurninDestinationSettings]
readPrec :: ReadPrec BurninDestinationSettings
$creadPrec :: ReadPrec BurninDestinationSettings
readList :: ReadS [BurninDestinationSettings]
$creadList :: ReadS [BurninDestinationSettings]
readsPrec :: Int -> ReadS BurninDestinationSettings
$creadsPrec :: Int -> ReadS BurninDestinationSettings
Prelude.Read, Int -> BurninDestinationSettings -> ShowS
[BurninDestinationSettings] -> ShowS
BurninDestinationSettings -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [BurninDestinationSettings] -> ShowS
$cshowList :: [BurninDestinationSettings] -> ShowS
show :: BurninDestinationSettings -> String
$cshow :: BurninDestinationSettings -> String
showsPrec :: Int -> BurninDestinationSettings -> ShowS
$cshowsPrec :: Int -> BurninDestinationSettings -> ShowS
Prelude.Show, forall x.
Rep BurninDestinationSettings x -> BurninDestinationSettings
forall x.
BurninDestinationSettings -> Rep BurninDestinationSettings x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep BurninDestinationSettings x -> BurninDestinationSettings
$cfrom :: forall x.
BurninDestinationSettings -> Rep BurninDestinationSettings x
Prelude.Generic)

-- |
-- Create a value of 'BurninDestinationSettings' 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:
--
-- 'alignment', 'burninDestinationSettings_alignment' - Specify the alignment of your captions. If no explicit x_position is
-- provided, setting alignment to centered will placethe captions at the
-- bottom center of the output. Similarly, setting a left alignment
-- willalign captions to the bottom left of the output. If x and y
-- positions are given in conjunction with the alignment parameter, the
-- font will be justified (either left or centered) relative to those
-- coordinates.
--
-- 'applyFontColor', 'burninDestinationSettings_applyFontColor' - Ignore this setting unless Style passthrough (StylePassthrough) is set
-- to Enabled and Font color (FontColor) set to Black, Yellow, Red, Green,
-- Blue, or Hex. Use Apply font color (ApplyFontColor) for additional font
-- color controls. When you choose White text only (WHITE_TEXT_ONLY), or
-- leave blank, your font color setting only applies to white text in your
-- input captions. For example, if your font color setting is Yellow, and
-- your input captions have red and white text, your output captions will
-- have red and yellow text. When you choose ALL_TEXT, your font color
-- setting applies to all of your output captions text.
--
-- 'backgroundColor', 'burninDestinationSettings_backgroundColor' - Specify the color of the rectangle behind the captions. Leave background
-- color (BackgroundColor) blank and set Style passthrough
-- (StylePassthrough) to enabled to use the background color data from your
-- input captions, if present.
--
-- 'backgroundOpacity', 'burninDestinationSettings_backgroundOpacity' - Specify the opacity of the background rectangle. Enter a value from 0 to
-- 255, where 0 is transparent and 255 is opaque. If Style passthrough
-- (StylePassthrough) is set to enabled, leave blank to pass through the
-- background style information in your input captions to your output
-- captions. If Style passthrough is set to disabled, leave blank to use a
-- value of 0 and remove all backgrounds from your output captions.
--
-- 'fallbackFont', 'burninDestinationSettings_fallbackFont' - Specify the font that you want the service to use for your burn in
-- captions when your input captions specify a font that MediaConvert
-- doesn\'t support. When you set Fallback font (FallbackFont) to best
-- match (BEST_MATCH), or leave blank, MediaConvert uses a supported font
-- that most closely matches the font that your input captions specify.
-- When there are multiple unsupported fonts in your input captions,
-- MediaConvert matches each font with the supported font that matches
-- best. When you explicitly choose a replacement font, MediaConvert uses
-- that font to replace all unsupported fonts from your input.
--
-- 'fontColor', 'burninDestinationSettings_fontColor' - Specify the color of the burned-in captions text. Leave Font color
-- (FontColor) blank and set Style passthrough (StylePassthrough) to
-- enabled to use the font color data from your input captions, if present.
--
-- 'fontOpacity', 'burninDestinationSettings_fontOpacity' - Specify the opacity of the burned-in captions. 255 is opaque; 0 is
-- transparent.
--
-- 'fontResolution', 'burninDestinationSettings_fontResolution' - Specify the Font resolution (FontResolution) in DPI (dots per inch).
--
-- 'fontScript', 'burninDestinationSettings_fontScript' - Set Font script (FontScript) to Automatically determined (AUTOMATIC), or
-- leave blank, to automatically determine the font script in your input
-- captions. Otherwise, set to Simplified Chinese (HANS) or Traditional
-- Chinese (HANT) if your input font script uses Simplified or Traditional
-- Chinese.
--
-- 'fontSize', 'burninDestinationSettings_fontSize' - Specify the Font size (FontSize) in pixels. Must be a positive integer.
-- Set to 0, or leave blank, for automatic font size.
--
-- 'hexFontColor', 'burninDestinationSettings_hexFontColor' - Ignore this setting unless your Font color is set to Hex. Enter either
-- six or eight hexidecimal digits, representing red, green, and blue, with
-- two optional extra digits for alpha. For example a value of 1122AABB is
-- a red value of 0x11, a green value of 0x22, a blue value of 0xAA, and an
-- alpha value of 0xBB.
--
-- 'outlineColor', 'burninDestinationSettings_outlineColor' - Specify font outline color. Leave Outline color (OutlineColor) blank and
-- set Style passthrough (StylePassthrough) to enabled to use the font
-- outline color data from your input captions, if present.
--
-- 'outlineSize', 'burninDestinationSettings_outlineSize' - Specify the Outline size (OutlineSize) of the caption text, in pixels.
-- Leave Outline size blank and set Style passthrough (StylePassthrough) to
-- enabled to use the outline size data from your input captions, if
-- present.
--
-- 'shadowColor', 'burninDestinationSettings_shadowColor' - Specify the color of the shadow cast by the captions. Leave Shadow color
-- (ShadowColor) blank and set Style passthrough (StylePassthrough) to
-- enabled to use the shadow color data from your input captions, if
-- present.
--
-- 'shadowOpacity', 'burninDestinationSettings_shadowOpacity' - Specify the opacity of the shadow. Enter a value from 0 to 255, where 0
-- is transparent and 255 is opaque. If Style passthrough
-- (StylePassthrough) is set to Enabled, leave Shadow opacity
-- (ShadowOpacity) blank to pass through the shadow style information in
-- your input captions to your output captions. If Style passthrough is set
-- to disabled, leave blank to use a value of 0 and remove all shadows from
-- your output captions.
--
-- 'shadowXOffset', 'burninDestinationSettings_shadowXOffset' - Specify the horizontal offset of the shadow, relative to the captions in
-- pixels. A value of -2 would result in a shadow offset 2 pixels to the
-- left.
--
-- 'shadowYOffset', 'burninDestinationSettings_shadowYOffset' - Specify the vertical offset of the shadow relative to the captions in
-- pixels. A value of -2 would result in a shadow offset 2 pixels above the
-- text. Leave Shadow y-offset (ShadowYOffset) blank and set Style
-- passthrough (StylePassthrough) to enabled to use the shadow y-offset
-- data from your input captions, if present.
--
-- 'stylePassthrough', 'burninDestinationSettings_stylePassthrough' - Set Style passthrough (StylePassthrough) to ENABLED to use the available
-- style, color, and position information from your input captions.
-- MediaConvert uses default settings for any missing style and position
-- information in your input captions. Set Style passthrough to DISABLED,
-- or leave blank, to ignore the style and position information from your
-- input captions and use default settings: white text with black
-- outlining, bottom-center positioning, and automatic sizing. Whether you
-- set Style passthrough to enabled or not, you can also choose to manually
-- override any of the individual style and position settings.
--
-- 'teletextSpacing', 'burninDestinationSettings_teletextSpacing' - Specify whether the text spacing (TeletextSpacing) in your captions is
-- set by the captions grid, or varies depending on letter width. Choose
-- fixed grid (FIXED_GRID) to conform to the spacing specified in the
-- captions file more accurately. Choose proportional (PROPORTIONAL) to
-- make the text easier to read for closed captions.
--
-- 'xPosition', 'burninDestinationSettings_xPosition' - Specify the horizontal position (XPosition) of the captions, relative to
-- the left side of the output in pixels. A value of 10 would result in the
-- captions starting 10 pixels from the left of the output. If no explicit
-- x_position is provided, the horizontal caption position will be
-- determined by the alignment parameter.
--
-- 'yPosition', 'burninDestinationSettings_yPosition' - Specify the vertical position (YPosition) of the captions, relative to
-- the top of the output in pixels. A value of 10 would result in the
-- captions starting 10 pixels from the top of the output. If no explicit
-- y_position is provided, the caption will be positioned towards the
-- bottom of the output.
newBurninDestinationSettings ::
  BurninDestinationSettings
newBurninDestinationSettings :: BurninDestinationSettings
newBurninDestinationSettings =
  BurninDestinationSettings'
    { $sel:alignment:BurninDestinationSettings' :: Maybe BurninSubtitleAlignment
alignment =
        forall a. Maybe a
Prelude.Nothing,
      $sel:applyFontColor:BurninDestinationSettings' :: Maybe BurninSubtitleApplyFontColor
applyFontColor = forall a. Maybe a
Prelude.Nothing,
      $sel:backgroundColor:BurninDestinationSettings' :: Maybe BurninSubtitleBackgroundColor
backgroundColor = forall a. Maybe a
Prelude.Nothing,
      $sel:backgroundOpacity:BurninDestinationSettings' :: Maybe Natural
backgroundOpacity = forall a. Maybe a
Prelude.Nothing,
      $sel:fallbackFont:BurninDestinationSettings' :: Maybe BurninSubtitleFallbackFont
fallbackFont = forall a. Maybe a
Prelude.Nothing,
      $sel:fontColor:BurninDestinationSettings' :: Maybe BurninSubtitleFontColor
fontColor = forall a. Maybe a
Prelude.Nothing,
      $sel:fontOpacity:BurninDestinationSettings' :: Maybe Natural
fontOpacity = forall a. Maybe a
Prelude.Nothing,
      $sel:fontResolution:BurninDestinationSettings' :: Maybe Natural
fontResolution = forall a. Maybe a
Prelude.Nothing,
      $sel:fontScript:BurninDestinationSettings' :: Maybe FontScript
fontScript = forall a. Maybe a
Prelude.Nothing,
      $sel:fontSize:BurninDestinationSettings' :: Maybe Natural
fontSize = forall a. Maybe a
Prelude.Nothing,
      $sel:hexFontColor:BurninDestinationSettings' :: Maybe Text
hexFontColor = forall a. Maybe a
Prelude.Nothing,
      $sel:outlineColor:BurninDestinationSettings' :: Maybe BurninSubtitleOutlineColor
outlineColor = forall a. Maybe a
Prelude.Nothing,
      $sel:outlineSize:BurninDestinationSettings' :: Maybe Natural
outlineSize = forall a. Maybe a
Prelude.Nothing,
      $sel:shadowColor:BurninDestinationSettings' :: Maybe BurninSubtitleShadowColor
shadowColor = forall a. Maybe a
Prelude.Nothing,
      $sel:shadowOpacity:BurninDestinationSettings' :: Maybe Natural
shadowOpacity = forall a. Maybe a
Prelude.Nothing,
      $sel:shadowXOffset:BurninDestinationSettings' :: Maybe Int
shadowXOffset = forall a. Maybe a
Prelude.Nothing,
      $sel:shadowYOffset:BurninDestinationSettings' :: Maybe Int
shadowYOffset = forall a. Maybe a
Prelude.Nothing,
      $sel:stylePassthrough:BurninDestinationSettings' :: Maybe BurnInSubtitleStylePassthrough
stylePassthrough = forall a. Maybe a
Prelude.Nothing,
      $sel:teletextSpacing:BurninDestinationSettings' :: Maybe BurninSubtitleTeletextSpacing
teletextSpacing = forall a. Maybe a
Prelude.Nothing,
      $sel:xPosition:BurninDestinationSettings' :: Maybe Natural
xPosition = forall a. Maybe a
Prelude.Nothing,
      $sel:yPosition:BurninDestinationSettings' :: Maybe Natural
yPosition = forall a. Maybe a
Prelude.Nothing
    }

-- | Specify the alignment of your captions. If no explicit x_position is
-- provided, setting alignment to centered will placethe captions at the
-- bottom center of the output. Similarly, setting a left alignment
-- willalign captions to the bottom left of the output. If x and y
-- positions are given in conjunction with the alignment parameter, the
-- font will be justified (either left or centered) relative to those
-- coordinates.
burninDestinationSettings_alignment :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe BurninSubtitleAlignment)
burninDestinationSettings_alignment :: Lens' BurninDestinationSettings (Maybe BurninSubtitleAlignment)
burninDestinationSettings_alignment = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe BurninSubtitleAlignment
alignment :: Maybe BurninSubtitleAlignment
$sel:alignment:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleAlignment
alignment} -> Maybe BurninSubtitleAlignment
alignment) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe BurninSubtitleAlignment
a -> BurninDestinationSettings
s {$sel:alignment:BurninDestinationSettings' :: Maybe BurninSubtitleAlignment
alignment = Maybe BurninSubtitleAlignment
a} :: BurninDestinationSettings)

-- | Ignore this setting unless Style passthrough (StylePassthrough) is set
-- to Enabled and Font color (FontColor) set to Black, Yellow, Red, Green,
-- Blue, or Hex. Use Apply font color (ApplyFontColor) for additional font
-- color controls. When you choose White text only (WHITE_TEXT_ONLY), or
-- leave blank, your font color setting only applies to white text in your
-- input captions. For example, if your font color setting is Yellow, and
-- your input captions have red and white text, your output captions will
-- have red and yellow text. When you choose ALL_TEXT, your font color
-- setting applies to all of your output captions text.
burninDestinationSettings_applyFontColor :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe BurninSubtitleApplyFontColor)
burninDestinationSettings_applyFontColor :: Lens'
  BurninDestinationSettings (Maybe BurninSubtitleApplyFontColor)
burninDestinationSettings_applyFontColor = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe BurninSubtitleApplyFontColor
applyFontColor :: Maybe BurninSubtitleApplyFontColor
$sel:applyFontColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleApplyFontColor
applyFontColor} -> Maybe BurninSubtitleApplyFontColor
applyFontColor) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe BurninSubtitleApplyFontColor
a -> BurninDestinationSettings
s {$sel:applyFontColor:BurninDestinationSettings' :: Maybe BurninSubtitleApplyFontColor
applyFontColor = Maybe BurninSubtitleApplyFontColor
a} :: BurninDestinationSettings)

-- | Specify the color of the rectangle behind the captions. Leave background
-- color (BackgroundColor) blank and set Style passthrough
-- (StylePassthrough) to enabled to use the background color data from your
-- input captions, if present.
burninDestinationSettings_backgroundColor :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe BurninSubtitleBackgroundColor)
burninDestinationSettings_backgroundColor :: Lens'
  BurninDestinationSettings (Maybe BurninSubtitleBackgroundColor)
burninDestinationSettings_backgroundColor = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe BurninSubtitleBackgroundColor
backgroundColor :: Maybe BurninSubtitleBackgroundColor
$sel:backgroundColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleBackgroundColor
backgroundColor} -> Maybe BurninSubtitleBackgroundColor
backgroundColor) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe BurninSubtitleBackgroundColor
a -> BurninDestinationSettings
s {$sel:backgroundColor:BurninDestinationSettings' :: Maybe BurninSubtitleBackgroundColor
backgroundColor = Maybe BurninSubtitleBackgroundColor
a} :: BurninDestinationSettings)

-- | Specify the opacity of the background rectangle. Enter a value from 0 to
-- 255, where 0 is transparent and 255 is opaque. If Style passthrough
-- (StylePassthrough) is set to enabled, leave blank to pass through the
-- background style information in your input captions to your output
-- captions. If Style passthrough is set to disabled, leave blank to use a
-- value of 0 and remove all backgrounds from your output captions.
burninDestinationSettings_backgroundOpacity :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe Prelude.Natural)
burninDestinationSettings_backgroundOpacity :: Lens' BurninDestinationSettings (Maybe Natural)
burninDestinationSettings_backgroundOpacity = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe Natural
backgroundOpacity :: Maybe Natural
$sel:backgroundOpacity:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
backgroundOpacity} -> Maybe Natural
backgroundOpacity) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe Natural
a -> BurninDestinationSettings
s {$sel:backgroundOpacity:BurninDestinationSettings' :: Maybe Natural
backgroundOpacity = Maybe Natural
a} :: BurninDestinationSettings)

-- | Specify the font that you want the service to use for your burn in
-- captions when your input captions specify a font that MediaConvert
-- doesn\'t support. When you set Fallback font (FallbackFont) to best
-- match (BEST_MATCH), or leave blank, MediaConvert uses a supported font
-- that most closely matches the font that your input captions specify.
-- When there are multiple unsupported fonts in your input captions,
-- MediaConvert matches each font with the supported font that matches
-- best. When you explicitly choose a replacement font, MediaConvert uses
-- that font to replace all unsupported fonts from your input.
burninDestinationSettings_fallbackFont :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe BurninSubtitleFallbackFont)
burninDestinationSettings_fallbackFont :: Lens' BurninDestinationSettings (Maybe BurninSubtitleFallbackFont)
burninDestinationSettings_fallbackFont = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe BurninSubtitleFallbackFont
fallbackFont :: Maybe BurninSubtitleFallbackFont
$sel:fallbackFont:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleFallbackFont
fallbackFont} -> Maybe BurninSubtitleFallbackFont
fallbackFont) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe BurninSubtitleFallbackFont
a -> BurninDestinationSettings
s {$sel:fallbackFont:BurninDestinationSettings' :: Maybe BurninSubtitleFallbackFont
fallbackFont = Maybe BurninSubtitleFallbackFont
a} :: BurninDestinationSettings)

-- | Specify the color of the burned-in captions text. Leave Font color
-- (FontColor) blank and set Style passthrough (StylePassthrough) to
-- enabled to use the font color data from your input captions, if present.
burninDestinationSettings_fontColor :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe BurninSubtitleFontColor)
burninDestinationSettings_fontColor :: Lens' BurninDestinationSettings (Maybe BurninSubtitleFontColor)
burninDestinationSettings_fontColor = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe BurninSubtitleFontColor
fontColor :: Maybe BurninSubtitleFontColor
$sel:fontColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleFontColor
fontColor} -> Maybe BurninSubtitleFontColor
fontColor) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe BurninSubtitleFontColor
a -> BurninDestinationSettings
s {$sel:fontColor:BurninDestinationSettings' :: Maybe BurninSubtitleFontColor
fontColor = Maybe BurninSubtitleFontColor
a} :: BurninDestinationSettings)

-- | Specify the opacity of the burned-in captions. 255 is opaque; 0 is
-- transparent.
burninDestinationSettings_fontOpacity :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe Prelude.Natural)
burninDestinationSettings_fontOpacity :: Lens' BurninDestinationSettings (Maybe Natural)
burninDestinationSettings_fontOpacity = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe Natural
fontOpacity :: Maybe Natural
$sel:fontOpacity:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
fontOpacity} -> Maybe Natural
fontOpacity) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe Natural
a -> BurninDestinationSettings
s {$sel:fontOpacity:BurninDestinationSettings' :: Maybe Natural
fontOpacity = Maybe Natural
a} :: BurninDestinationSettings)

-- | Specify the Font resolution (FontResolution) in DPI (dots per inch).
burninDestinationSettings_fontResolution :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe Prelude.Natural)
burninDestinationSettings_fontResolution :: Lens' BurninDestinationSettings (Maybe Natural)
burninDestinationSettings_fontResolution = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe Natural
fontResolution :: Maybe Natural
$sel:fontResolution:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
fontResolution} -> Maybe Natural
fontResolution) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe Natural
a -> BurninDestinationSettings
s {$sel:fontResolution:BurninDestinationSettings' :: Maybe Natural
fontResolution = Maybe Natural
a} :: BurninDestinationSettings)

-- | Set Font script (FontScript) to Automatically determined (AUTOMATIC), or
-- leave blank, to automatically determine the font script in your input
-- captions. Otherwise, set to Simplified Chinese (HANS) or Traditional
-- Chinese (HANT) if your input font script uses Simplified or Traditional
-- Chinese.
burninDestinationSettings_fontScript :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe FontScript)
burninDestinationSettings_fontScript :: Lens' BurninDestinationSettings (Maybe FontScript)
burninDestinationSettings_fontScript = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe FontScript
fontScript :: Maybe FontScript
$sel:fontScript:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe FontScript
fontScript} -> Maybe FontScript
fontScript) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe FontScript
a -> BurninDestinationSettings
s {$sel:fontScript:BurninDestinationSettings' :: Maybe FontScript
fontScript = Maybe FontScript
a} :: BurninDestinationSettings)

-- | Specify the Font size (FontSize) in pixels. Must be a positive integer.
-- Set to 0, or leave blank, for automatic font size.
burninDestinationSettings_fontSize :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe Prelude.Natural)
burninDestinationSettings_fontSize :: Lens' BurninDestinationSettings (Maybe Natural)
burninDestinationSettings_fontSize = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe Natural
fontSize :: Maybe Natural
$sel:fontSize:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
fontSize} -> Maybe Natural
fontSize) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe Natural
a -> BurninDestinationSettings
s {$sel:fontSize:BurninDestinationSettings' :: Maybe Natural
fontSize = Maybe Natural
a} :: BurninDestinationSettings)

-- | Ignore this setting unless your Font color is set to Hex. Enter either
-- six or eight hexidecimal digits, representing red, green, and blue, with
-- two optional extra digits for alpha. For example a value of 1122AABB is
-- a red value of 0x11, a green value of 0x22, a blue value of 0xAA, and an
-- alpha value of 0xBB.
burninDestinationSettings_hexFontColor :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe Prelude.Text)
burninDestinationSettings_hexFontColor :: Lens' BurninDestinationSettings (Maybe Text)
burninDestinationSettings_hexFontColor = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe Text
hexFontColor :: Maybe Text
$sel:hexFontColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Text
hexFontColor} -> Maybe Text
hexFontColor) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe Text
a -> BurninDestinationSettings
s {$sel:hexFontColor:BurninDestinationSettings' :: Maybe Text
hexFontColor = Maybe Text
a} :: BurninDestinationSettings)

-- | Specify font outline color. Leave Outline color (OutlineColor) blank and
-- set Style passthrough (StylePassthrough) to enabled to use the font
-- outline color data from your input captions, if present.
burninDestinationSettings_outlineColor :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe BurninSubtitleOutlineColor)
burninDestinationSettings_outlineColor :: Lens' BurninDestinationSettings (Maybe BurninSubtitleOutlineColor)
burninDestinationSettings_outlineColor = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe BurninSubtitleOutlineColor
outlineColor :: Maybe BurninSubtitleOutlineColor
$sel:outlineColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleOutlineColor
outlineColor} -> Maybe BurninSubtitleOutlineColor
outlineColor) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe BurninSubtitleOutlineColor
a -> BurninDestinationSettings
s {$sel:outlineColor:BurninDestinationSettings' :: Maybe BurninSubtitleOutlineColor
outlineColor = Maybe BurninSubtitleOutlineColor
a} :: BurninDestinationSettings)

-- | Specify the Outline size (OutlineSize) of the caption text, in pixels.
-- Leave Outline size blank and set Style passthrough (StylePassthrough) to
-- enabled to use the outline size data from your input captions, if
-- present.
burninDestinationSettings_outlineSize :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe Prelude.Natural)
burninDestinationSettings_outlineSize :: Lens' BurninDestinationSettings (Maybe Natural)
burninDestinationSettings_outlineSize = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe Natural
outlineSize :: Maybe Natural
$sel:outlineSize:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
outlineSize} -> Maybe Natural
outlineSize) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe Natural
a -> BurninDestinationSettings
s {$sel:outlineSize:BurninDestinationSettings' :: Maybe Natural
outlineSize = Maybe Natural
a} :: BurninDestinationSettings)

-- | Specify the color of the shadow cast by the captions. Leave Shadow color
-- (ShadowColor) blank and set Style passthrough (StylePassthrough) to
-- enabled to use the shadow color data from your input captions, if
-- present.
burninDestinationSettings_shadowColor :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe BurninSubtitleShadowColor)
burninDestinationSettings_shadowColor :: Lens' BurninDestinationSettings (Maybe BurninSubtitleShadowColor)
burninDestinationSettings_shadowColor = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe BurninSubtitleShadowColor
shadowColor :: Maybe BurninSubtitleShadowColor
$sel:shadowColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleShadowColor
shadowColor} -> Maybe BurninSubtitleShadowColor
shadowColor) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe BurninSubtitleShadowColor
a -> BurninDestinationSettings
s {$sel:shadowColor:BurninDestinationSettings' :: Maybe BurninSubtitleShadowColor
shadowColor = Maybe BurninSubtitleShadowColor
a} :: BurninDestinationSettings)

-- | Specify the opacity of the shadow. Enter a value from 0 to 255, where 0
-- is transparent and 255 is opaque. If Style passthrough
-- (StylePassthrough) is set to Enabled, leave Shadow opacity
-- (ShadowOpacity) blank to pass through the shadow style information in
-- your input captions to your output captions. If Style passthrough is set
-- to disabled, leave blank to use a value of 0 and remove all shadows from
-- your output captions.
burninDestinationSettings_shadowOpacity :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe Prelude.Natural)
burninDestinationSettings_shadowOpacity :: Lens' BurninDestinationSettings (Maybe Natural)
burninDestinationSettings_shadowOpacity = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe Natural
shadowOpacity :: Maybe Natural
$sel:shadowOpacity:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
shadowOpacity} -> Maybe Natural
shadowOpacity) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe Natural
a -> BurninDestinationSettings
s {$sel:shadowOpacity:BurninDestinationSettings' :: Maybe Natural
shadowOpacity = Maybe Natural
a} :: BurninDestinationSettings)

-- | Specify the horizontal offset of the shadow, relative to the captions in
-- pixels. A value of -2 would result in a shadow offset 2 pixels to the
-- left.
burninDestinationSettings_shadowXOffset :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe Prelude.Int)
burninDestinationSettings_shadowXOffset :: Lens' BurninDestinationSettings (Maybe Int)
burninDestinationSettings_shadowXOffset = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe Int
shadowXOffset :: Maybe Int
$sel:shadowXOffset:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Int
shadowXOffset} -> Maybe Int
shadowXOffset) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe Int
a -> BurninDestinationSettings
s {$sel:shadowXOffset:BurninDestinationSettings' :: Maybe Int
shadowXOffset = Maybe Int
a} :: BurninDestinationSettings)

-- | Specify the vertical offset of the shadow relative to the captions in
-- pixels. A value of -2 would result in a shadow offset 2 pixels above the
-- text. Leave Shadow y-offset (ShadowYOffset) blank and set Style
-- passthrough (StylePassthrough) to enabled to use the shadow y-offset
-- data from your input captions, if present.
burninDestinationSettings_shadowYOffset :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe Prelude.Int)
burninDestinationSettings_shadowYOffset :: Lens' BurninDestinationSettings (Maybe Int)
burninDestinationSettings_shadowYOffset = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe Int
shadowYOffset :: Maybe Int
$sel:shadowYOffset:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Int
shadowYOffset} -> Maybe Int
shadowYOffset) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe Int
a -> BurninDestinationSettings
s {$sel:shadowYOffset:BurninDestinationSettings' :: Maybe Int
shadowYOffset = Maybe Int
a} :: BurninDestinationSettings)

-- | Set Style passthrough (StylePassthrough) to ENABLED to use the available
-- style, color, and position information from your input captions.
-- MediaConvert uses default settings for any missing style and position
-- information in your input captions. Set Style passthrough to DISABLED,
-- or leave blank, to ignore the style and position information from your
-- input captions and use default settings: white text with black
-- outlining, bottom-center positioning, and automatic sizing. Whether you
-- set Style passthrough to enabled or not, you can also choose to manually
-- override any of the individual style and position settings.
burninDestinationSettings_stylePassthrough :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe BurnInSubtitleStylePassthrough)
burninDestinationSettings_stylePassthrough :: Lens'
  BurninDestinationSettings (Maybe BurnInSubtitleStylePassthrough)
burninDestinationSettings_stylePassthrough = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe BurnInSubtitleStylePassthrough
stylePassthrough :: Maybe BurnInSubtitleStylePassthrough
$sel:stylePassthrough:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurnInSubtitleStylePassthrough
stylePassthrough} -> Maybe BurnInSubtitleStylePassthrough
stylePassthrough) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe BurnInSubtitleStylePassthrough
a -> BurninDestinationSettings
s {$sel:stylePassthrough:BurninDestinationSettings' :: Maybe BurnInSubtitleStylePassthrough
stylePassthrough = Maybe BurnInSubtitleStylePassthrough
a} :: BurninDestinationSettings)

-- | Specify whether the text spacing (TeletextSpacing) in your captions is
-- set by the captions grid, or varies depending on letter width. Choose
-- fixed grid (FIXED_GRID) to conform to the spacing specified in the
-- captions file more accurately. Choose proportional (PROPORTIONAL) to
-- make the text easier to read for closed captions.
burninDestinationSettings_teletextSpacing :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe BurninSubtitleTeletextSpacing)
burninDestinationSettings_teletextSpacing :: Lens'
  BurninDestinationSettings (Maybe BurninSubtitleTeletextSpacing)
burninDestinationSettings_teletextSpacing = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe BurninSubtitleTeletextSpacing
teletextSpacing :: Maybe BurninSubtitleTeletextSpacing
$sel:teletextSpacing:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleTeletextSpacing
teletextSpacing} -> Maybe BurninSubtitleTeletextSpacing
teletextSpacing) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe BurninSubtitleTeletextSpacing
a -> BurninDestinationSettings
s {$sel:teletextSpacing:BurninDestinationSettings' :: Maybe BurninSubtitleTeletextSpacing
teletextSpacing = Maybe BurninSubtitleTeletextSpacing
a} :: BurninDestinationSettings)

-- | Specify the horizontal position (XPosition) of the captions, relative to
-- the left side of the output in pixels. A value of 10 would result in the
-- captions starting 10 pixels from the left of the output. If no explicit
-- x_position is provided, the horizontal caption position will be
-- determined by the alignment parameter.
burninDestinationSettings_xPosition :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe Prelude.Natural)
burninDestinationSettings_xPosition :: Lens' BurninDestinationSettings (Maybe Natural)
burninDestinationSettings_xPosition = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe Natural
xPosition :: Maybe Natural
$sel:xPosition:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
xPosition} -> Maybe Natural
xPosition) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe Natural
a -> BurninDestinationSettings
s {$sel:xPosition:BurninDestinationSettings' :: Maybe Natural
xPosition = Maybe Natural
a} :: BurninDestinationSettings)

-- | Specify the vertical position (YPosition) of the captions, relative to
-- the top of the output in pixels. A value of 10 would result in the
-- captions starting 10 pixels from the top of the output. If no explicit
-- y_position is provided, the caption will be positioned towards the
-- bottom of the output.
burninDestinationSettings_yPosition :: Lens.Lens' BurninDestinationSettings (Prelude.Maybe Prelude.Natural)
burninDestinationSettings_yPosition :: Lens' BurninDestinationSettings (Maybe Natural)
burninDestinationSettings_yPosition = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BurninDestinationSettings' {Maybe Natural
yPosition :: Maybe Natural
$sel:yPosition:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
yPosition} -> Maybe Natural
yPosition) (\s :: BurninDestinationSettings
s@BurninDestinationSettings' {} Maybe Natural
a -> BurninDestinationSettings
s {$sel:yPosition:BurninDestinationSettings' :: Maybe Natural
yPosition = Maybe Natural
a} :: BurninDestinationSettings)

instance Data.FromJSON BurninDestinationSettings where
  parseJSON :: Value -> Parser BurninDestinationSettings
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"BurninDestinationSettings"
      ( \Object
x ->
          Maybe BurninSubtitleAlignment
-> Maybe BurninSubtitleApplyFontColor
-> Maybe BurninSubtitleBackgroundColor
-> Maybe Natural
-> Maybe BurninSubtitleFallbackFont
-> Maybe BurninSubtitleFontColor
-> Maybe Natural
-> Maybe Natural
-> Maybe FontScript
-> Maybe Natural
-> Maybe Text
-> Maybe BurninSubtitleOutlineColor
-> Maybe Natural
-> Maybe BurninSubtitleShadowColor
-> Maybe Natural
-> Maybe Int
-> Maybe Int
-> Maybe BurnInSubtitleStylePassthrough
-> Maybe BurninSubtitleTeletextSpacing
-> Maybe Natural
-> Maybe Natural
-> BurninDestinationSettings
BurninDestinationSettings'
            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
"alignment")
            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
"applyFontColor")
            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
"backgroundColor")
            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
"backgroundOpacity")
            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
"fallbackFont")
            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
"fontColor")
            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
"fontOpacity")
            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
"fontResolution")
            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
"fontScript")
            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
"fontSize")
            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
"hexFontColor")
            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
"outlineColor")
            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
"outlineSize")
            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
"shadowColor")
            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
"shadowOpacity")
            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
"shadowXOffset")
            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
"shadowYOffset")
            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
"stylePassthrough")
            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
"teletextSpacing")
            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
"xPosition")
            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
"yPosition")
      )

instance Prelude.Hashable BurninDestinationSettings where
  hashWithSalt :: Int -> BurninDestinationSettings -> Int
hashWithSalt Int
_salt BurninDestinationSettings' {Maybe Int
Maybe Natural
Maybe Text
Maybe BurnInSubtitleStylePassthrough
Maybe BurninSubtitleAlignment
Maybe BurninSubtitleApplyFontColor
Maybe BurninSubtitleBackgroundColor
Maybe BurninSubtitleFallbackFont
Maybe BurninSubtitleFontColor
Maybe BurninSubtitleOutlineColor
Maybe BurninSubtitleShadowColor
Maybe BurninSubtitleTeletextSpacing
Maybe FontScript
yPosition :: Maybe Natural
xPosition :: Maybe Natural
teletextSpacing :: Maybe BurninSubtitleTeletextSpacing
stylePassthrough :: Maybe BurnInSubtitleStylePassthrough
shadowYOffset :: Maybe Int
shadowXOffset :: Maybe Int
shadowOpacity :: Maybe Natural
shadowColor :: Maybe BurninSubtitleShadowColor
outlineSize :: Maybe Natural
outlineColor :: Maybe BurninSubtitleOutlineColor
hexFontColor :: Maybe Text
fontSize :: Maybe Natural
fontScript :: Maybe FontScript
fontResolution :: Maybe Natural
fontOpacity :: Maybe Natural
fontColor :: Maybe BurninSubtitleFontColor
fallbackFont :: Maybe BurninSubtitleFallbackFont
backgroundOpacity :: Maybe Natural
backgroundColor :: Maybe BurninSubtitleBackgroundColor
applyFontColor :: Maybe BurninSubtitleApplyFontColor
alignment :: Maybe BurninSubtitleAlignment
$sel:yPosition:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:xPosition:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:teletextSpacing:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleTeletextSpacing
$sel:stylePassthrough:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurnInSubtitleStylePassthrough
$sel:shadowYOffset:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Int
$sel:shadowXOffset:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Int
$sel:shadowOpacity:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:shadowColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleShadowColor
$sel:outlineSize:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:outlineColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleOutlineColor
$sel:hexFontColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Text
$sel:fontSize:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:fontScript:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe FontScript
$sel:fontResolution:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:fontOpacity:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:fontColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleFontColor
$sel:fallbackFont:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleFallbackFont
$sel:backgroundOpacity:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:backgroundColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleBackgroundColor
$sel:applyFontColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleApplyFontColor
$sel:alignment:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleAlignment
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BurninSubtitleAlignment
alignment
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BurninSubtitleApplyFontColor
applyFontColor
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BurninSubtitleBackgroundColor
backgroundColor
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
backgroundOpacity
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BurninSubtitleFallbackFont
fallbackFont
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BurninSubtitleFontColor
fontColor
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
fontOpacity
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
fontResolution
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe FontScript
fontScript
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
fontSize
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
hexFontColor
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BurninSubtitleOutlineColor
outlineColor
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
outlineSize
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BurninSubtitleShadowColor
shadowColor
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
shadowOpacity
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
shadowXOffset
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
shadowYOffset
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BurnInSubtitleStylePassthrough
stylePassthrough
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BurninSubtitleTeletextSpacing
teletextSpacing
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
xPosition
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
yPosition

instance Prelude.NFData BurninDestinationSettings where
  rnf :: BurninDestinationSettings -> ()
rnf BurninDestinationSettings' {Maybe Int
Maybe Natural
Maybe Text
Maybe BurnInSubtitleStylePassthrough
Maybe BurninSubtitleAlignment
Maybe BurninSubtitleApplyFontColor
Maybe BurninSubtitleBackgroundColor
Maybe BurninSubtitleFallbackFont
Maybe BurninSubtitleFontColor
Maybe BurninSubtitleOutlineColor
Maybe BurninSubtitleShadowColor
Maybe BurninSubtitleTeletextSpacing
Maybe FontScript
yPosition :: Maybe Natural
xPosition :: Maybe Natural
teletextSpacing :: Maybe BurninSubtitleTeletextSpacing
stylePassthrough :: Maybe BurnInSubtitleStylePassthrough
shadowYOffset :: Maybe Int
shadowXOffset :: Maybe Int
shadowOpacity :: Maybe Natural
shadowColor :: Maybe BurninSubtitleShadowColor
outlineSize :: Maybe Natural
outlineColor :: Maybe BurninSubtitleOutlineColor
hexFontColor :: Maybe Text
fontSize :: Maybe Natural
fontScript :: Maybe FontScript
fontResolution :: Maybe Natural
fontOpacity :: Maybe Natural
fontColor :: Maybe BurninSubtitleFontColor
fallbackFont :: Maybe BurninSubtitleFallbackFont
backgroundOpacity :: Maybe Natural
backgroundColor :: Maybe BurninSubtitleBackgroundColor
applyFontColor :: Maybe BurninSubtitleApplyFontColor
alignment :: Maybe BurninSubtitleAlignment
$sel:yPosition:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:xPosition:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:teletextSpacing:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleTeletextSpacing
$sel:stylePassthrough:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurnInSubtitleStylePassthrough
$sel:shadowYOffset:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Int
$sel:shadowXOffset:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Int
$sel:shadowOpacity:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:shadowColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleShadowColor
$sel:outlineSize:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:outlineColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleOutlineColor
$sel:hexFontColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Text
$sel:fontSize:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:fontScript:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe FontScript
$sel:fontResolution:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:fontOpacity:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:fontColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleFontColor
$sel:fallbackFont:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleFallbackFont
$sel:backgroundOpacity:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:backgroundColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleBackgroundColor
$sel:applyFontColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleApplyFontColor
$sel:alignment:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleAlignment
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe BurninSubtitleAlignment
alignment
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BurninSubtitleApplyFontColor
applyFontColor
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BurninSubtitleBackgroundColor
backgroundColor
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
backgroundOpacity
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BurninSubtitleFallbackFont
fallbackFont
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BurninSubtitleFontColor
fontColor
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
fontOpacity
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
fontResolution
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe FontScript
fontScript
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
fontSize
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
hexFontColor
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BurninSubtitleOutlineColor
outlineColor
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
outlineSize
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BurninSubtitleShadowColor
shadowColor
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
shadowOpacity
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
shadowXOffset
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
shadowYOffset
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BurnInSubtitleStylePassthrough
stylePassthrough
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BurninSubtitleTeletextSpacing
teletextSpacing
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
xPosition
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
yPosition

instance Data.ToJSON BurninDestinationSettings where
  toJSON :: BurninDestinationSettings -> Value
toJSON BurninDestinationSettings' {Maybe Int
Maybe Natural
Maybe Text
Maybe BurnInSubtitleStylePassthrough
Maybe BurninSubtitleAlignment
Maybe BurninSubtitleApplyFontColor
Maybe BurninSubtitleBackgroundColor
Maybe BurninSubtitleFallbackFont
Maybe BurninSubtitleFontColor
Maybe BurninSubtitleOutlineColor
Maybe BurninSubtitleShadowColor
Maybe BurninSubtitleTeletextSpacing
Maybe FontScript
yPosition :: Maybe Natural
xPosition :: Maybe Natural
teletextSpacing :: Maybe BurninSubtitleTeletextSpacing
stylePassthrough :: Maybe BurnInSubtitleStylePassthrough
shadowYOffset :: Maybe Int
shadowXOffset :: Maybe Int
shadowOpacity :: Maybe Natural
shadowColor :: Maybe BurninSubtitleShadowColor
outlineSize :: Maybe Natural
outlineColor :: Maybe BurninSubtitleOutlineColor
hexFontColor :: Maybe Text
fontSize :: Maybe Natural
fontScript :: Maybe FontScript
fontResolution :: Maybe Natural
fontOpacity :: Maybe Natural
fontColor :: Maybe BurninSubtitleFontColor
fallbackFont :: Maybe BurninSubtitleFallbackFont
backgroundOpacity :: Maybe Natural
backgroundColor :: Maybe BurninSubtitleBackgroundColor
applyFontColor :: Maybe BurninSubtitleApplyFontColor
alignment :: Maybe BurninSubtitleAlignment
$sel:yPosition:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:xPosition:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:teletextSpacing:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleTeletextSpacing
$sel:stylePassthrough:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurnInSubtitleStylePassthrough
$sel:shadowYOffset:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Int
$sel:shadowXOffset:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Int
$sel:shadowOpacity:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:shadowColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleShadowColor
$sel:outlineSize:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:outlineColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleOutlineColor
$sel:hexFontColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Text
$sel:fontSize:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:fontScript:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe FontScript
$sel:fontResolution:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:fontOpacity:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:fontColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleFontColor
$sel:fallbackFont:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleFallbackFont
$sel:backgroundOpacity:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe Natural
$sel:backgroundColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleBackgroundColor
$sel:applyFontColor:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleApplyFontColor
$sel:alignment:BurninDestinationSettings' :: BurninDestinationSettings -> Maybe BurninSubtitleAlignment
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"alignment" 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 BurninSubtitleAlignment
alignment,
            (Key
"applyFontColor" 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 BurninSubtitleApplyFontColor
applyFontColor,
            (Key
"backgroundColor" 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 BurninSubtitleBackgroundColor
backgroundColor,
            (Key
"backgroundOpacity" 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
backgroundOpacity,
            (Key
"fallbackFont" 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 BurninSubtitleFallbackFont
fallbackFont,
            (Key
"fontColor" 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 BurninSubtitleFontColor
fontColor,
            (Key
"fontOpacity" 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
fontOpacity,
            (Key
"fontResolution" 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
fontResolution,
            (Key
"fontScript" 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 FontScript
fontScript,
            (Key
"fontSize" 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
fontSize,
            (Key
"hexFontColor" 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
hexFontColor,
            (Key
"outlineColor" 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 BurninSubtitleOutlineColor
outlineColor,
            (Key
"outlineSize" 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
outlineSize,
            (Key
"shadowColor" 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 BurninSubtitleShadowColor
shadowColor,
            (Key
"shadowOpacity" 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
shadowOpacity,
            (Key
"shadowXOffset" 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
shadowXOffset,
            (Key
"shadowYOffset" 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
shadowYOffset,
            (Key
"stylePassthrough" 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 BurnInSubtitleStylePassthrough
stylePassthrough,
            (Key
"teletextSpacing" 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 BurninSubtitleTeletextSpacing
teletextSpacing,
            (Key
"xPosition" 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
xPosition,
            (Key
"yPosition" 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
yPosition
          ]
      )