{-# 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.MediaLive.Types.DvbSubDestinationSettings
-- 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.MediaLive.Types.DvbSubDestinationSettings where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.MediaLive.Types.DvbSubDestinationAlignment
import Amazonka.MediaLive.Types.DvbSubDestinationBackgroundColor
import Amazonka.MediaLive.Types.DvbSubDestinationFontColor
import Amazonka.MediaLive.Types.DvbSubDestinationOutlineColor
import Amazonka.MediaLive.Types.DvbSubDestinationShadowColor
import Amazonka.MediaLive.Types.DvbSubDestinationTeletextGridControl
import Amazonka.MediaLive.Types.InputLocation
import qualified Amazonka.Prelude as Prelude

-- | Dvb Sub Destination Settings
--
-- /See:/ 'newDvbSubDestinationSettings' smart constructor.
data DvbSubDestinationSettings = DvbSubDestinationSettings'
  { -- | If no explicit xPosition or yPosition is provided, setting alignment to
    -- centered will place the captions at the bottom center of the output.
    -- Similarly, setting a left alignment will align 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. Selecting \"smart\"
    -- justification will left-justify live subtitles and center-justify
    -- pre-recorded subtitles. This option is not valid for source captions
    -- that are STL or 608\/embedded. These source settings are already
    -- pre-defined by the caption stream. All burn-in and DVB-Sub font settings
    -- must match.
    DvbSubDestinationSettings -> Maybe DvbSubDestinationAlignment
alignment :: Prelude.Maybe DvbSubDestinationAlignment,
    -- | Specifies the color of the rectangle behind the captions. All burn-in
    -- and DVB-Sub font settings must match.
    DvbSubDestinationSettings -> Maybe DvbSubDestinationBackgroundColor
backgroundColor :: Prelude.Maybe DvbSubDestinationBackgroundColor,
    -- | Specifies the opacity of the background rectangle. 255 is opaque; 0 is
    -- transparent. Leaving this parameter blank is equivalent to setting it to
    -- 0 (transparent). All burn-in and DVB-Sub font settings must match.
    DvbSubDestinationSettings -> Maybe Natural
backgroundOpacity :: Prelude.Maybe Prelude.Natural,
    -- | External font file used for caption burn-in. File extension must be
    -- \'ttf\' or \'tte\'. Although the user can select output fonts for many
    -- different types of input captions, embedded, STL and teletext sources
    -- use a strict grid system. Using external fonts with these caption
    -- sources could cause unexpected display of proportional fonts. All
    -- burn-in and DVB-Sub font settings must match.
    DvbSubDestinationSettings -> Maybe InputLocation
font :: Prelude.Maybe InputLocation,
    -- | Specifies the color of the burned-in captions. This option is not valid
    -- for source captions that are STL, 608\/embedded or teletext. These
    -- source settings are already pre-defined by the caption stream. All
    -- burn-in and DVB-Sub font settings must match.
    DvbSubDestinationSettings -> Maybe DvbSubDestinationFontColor
fontColor :: Prelude.Maybe DvbSubDestinationFontColor,
    -- | Specifies the opacity of the burned-in captions. 255 is opaque; 0 is
    -- transparent. All burn-in and DVB-Sub font settings must match.
    DvbSubDestinationSettings -> Maybe Natural
fontOpacity :: Prelude.Maybe Prelude.Natural,
    -- | Font resolution in DPI (dots per inch); default is 96 dpi. All burn-in
    -- and DVB-Sub font settings must match.
    DvbSubDestinationSettings -> Maybe Natural
fontResolution :: Prelude.Maybe Prelude.Natural,
    -- | When set to auto fontSize will scale depending on the size of the
    -- output. Giving a positive integer will specify the exact font size in
    -- points. All burn-in and DVB-Sub font settings must match.
    DvbSubDestinationSettings -> Maybe Text
fontSize :: Prelude.Maybe Prelude.Text,
    -- | Specifies font outline color. This option is not valid for source
    -- captions that are either 608\/embedded or teletext. These source
    -- settings are already pre-defined by the caption stream. All burn-in and
    -- DVB-Sub font settings must match.
    DvbSubDestinationSettings -> Maybe DvbSubDestinationOutlineColor
outlineColor :: Prelude.Maybe DvbSubDestinationOutlineColor,
    -- | Specifies font outline size in pixels. This option is not valid for
    -- source captions that are either 608\/embedded or teletext. These source
    -- settings are already pre-defined by the caption stream. All burn-in and
    -- DVB-Sub font settings must match.
    DvbSubDestinationSettings -> Maybe Natural
outlineSize :: Prelude.Maybe Prelude.Natural,
    -- | Specifies the color of the shadow cast by the captions. All burn-in and
    -- DVB-Sub font settings must match.
    DvbSubDestinationSettings -> Maybe DvbSubDestinationShadowColor
shadowColor :: Prelude.Maybe DvbSubDestinationShadowColor,
    -- | Specifies the opacity of the shadow. 255 is opaque; 0 is transparent.
    -- Leaving this parameter blank is equivalent to setting it to 0
    -- (transparent). All burn-in and DVB-Sub font settings must match.
    DvbSubDestinationSettings -> Maybe Natural
shadowOpacity :: Prelude.Maybe Prelude.Natural,
    -- | Specifies 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. All burn-in and DVB-Sub font settings must match.
    DvbSubDestinationSettings -> Maybe Int
shadowXOffset :: Prelude.Maybe Prelude.Int,
    -- | Specifies 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. All burn-in and DVB-Sub font settings must match.
    DvbSubDestinationSettings -> Maybe Int
shadowYOffset :: Prelude.Maybe Prelude.Int,
    -- | Controls whether a fixed grid size will be used to generate the output
    -- subtitles bitmap. Only applicable for Teletext inputs and
    -- DVB-Sub\/Burn-in outputs.
    DvbSubDestinationSettings
-> Maybe DvbSubDestinationTeletextGridControl
teletextGridControl :: Prelude.Maybe DvbSubDestinationTeletextGridControl,
    -- | Specifies the horizontal position of the caption 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 xPosition
    -- is provided, the horizontal caption position will be determined by the
    -- alignment parameter. This option is not valid for source captions that
    -- are STL, 608\/embedded or teletext. These source settings are already
    -- pre-defined by the caption stream. All burn-in and DVB-Sub font settings
    -- must match.
    DvbSubDestinationSettings -> Maybe Natural
xPosition :: Prelude.Maybe Prelude.Natural,
    -- | Specifies the vertical position of the caption 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 yPosition
    -- is provided, the caption will be positioned towards the bottom of the
    -- output. This option is not valid for source captions that are STL,
    -- 608\/embedded or teletext. These source settings are already pre-defined
    -- by the caption stream. All burn-in and DVB-Sub font settings must match.
    DvbSubDestinationSettings -> Maybe Natural
yPosition :: Prelude.Maybe Prelude.Natural
  }
  deriving (DvbSubDestinationSettings -> DvbSubDestinationSettings -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DvbSubDestinationSettings -> DvbSubDestinationSettings -> Bool
$c/= :: DvbSubDestinationSettings -> DvbSubDestinationSettings -> Bool
== :: DvbSubDestinationSettings -> DvbSubDestinationSettings -> Bool
$c== :: DvbSubDestinationSettings -> DvbSubDestinationSettings -> Bool
Prelude.Eq, ReadPrec [DvbSubDestinationSettings]
ReadPrec DvbSubDestinationSettings
Int -> ReadS DvbSubDestinationSettings
ReadS [DvbSubDestinationSettings]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DvbSubDestinationSettings]
$creadListPrec :: ReadPrec [DvbSubDestinationSettings]
readPrec :: ReadPrec DvbSubDestinationSettings
$creadPrec :: ReadPrec DvbSubDestinationSettings
readList :: ReadS [DvbSubDestinationSettings]
$creadList :: ReadS [DvbSubDestinationSettings]
readsPrec :: Int -> ReadS DvbSubDestinationSettings
$creadsPrec :: Int -> ReadS DvbSubDestinationSettings
Prelude.Read, Int -> DvbSubDestinationSettings -> ShowS
[DvbSubDestinationSettings] -> ShowS
DvbSubDestinationSettings -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DvbSubDestinationSettings] -> ShowS
$cshowList :: [DvbSubDestinationSettings] -> ShowS
show :: DvbSubDestinationSettings -> String
$cshow :: DvbSubDestinationSettings -> String
showsPrec :: Int -> DvbSubDestinationSettings -> ShowS
$cshowsPrec :: Int -> DvbSubDestinationSettings -> ShowS
Prelude.Show, forall x.
Rep DvbSubDestinationSettings x -> DvbSubDestinationSettings
forall x.
DvbSubDestinationSettings -> Rep DvbSubDestinationSettings x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DvbSubDestinationSettings x -> DvbSubDestinationSettings
$cfrom :: forall x.
DvbSubDestinationSettings -> Rep DvbSubDestinationSettings x
Prelude.Generic)

-- |
-- Create a value of 'DvbSubDestinationSettings' 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', 'dvbSubDestinationSettings_alignment' - If no explicit xPosition or yPosition is provided, setting alignment to
-- centered will place the captions at the bottom center of the output.
-- Similarly, setting a left alignment will align 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. Selecting \"smart\"
-- justification will left-justify live subtitles and center-justify
-- pre-recorded subtitles. This option is not valid for source captions
-- that are STL or 608\/embedded. These source settings are already
-- pre-defined by the caption stream. All burn-in and DVB-Sub font settings
-- must match.
--
-- 'backgroundColor', 'dvbSubDestinationSettings_backgroundColor' - Specifies the color of the rectangle behind the captions. All burn-in
-- and DVB-Sub font settings must match.
--
-- 'backgroundOpacity', 'dvbSubDestinationSettings_backgroundOpacity' - Specifies the opacity of the background rectangle. 255 is opaque; 0 is
-- transparent. Leaving this parameter blank is equivalent to setting it to
-- 0 (transparent). All burn-in and DVB-Sub font settings must match.
--
-- 'font', 'dvbSubDestinationSettings_font' - External font file used for caption burn-in. File extension must be
-- \'ttf\' or \'tte\'. Although the user can select output fonts for many
-- different types of input captions, embedded, STL and teletext sources
-- use a strict grid system. Using external fonts with these caption
-- sources could cause unexpected display of proportional fonts. All
-- burn-in and DVB-Sub font settings must match.
--
-- 'fontColor', 'dvbSubDestinationSettings_fontColor' - Specifies the color of the burned-in captions. This option is not valid
-- for source captions that are STL, 608\/embedded or teletext. These
-- source settings are already pre-defined by the caption stream. All
-- burn-in and DVB-Sub font settings must match.
--
-- 'fontOpacity', 'dvbSubDestinationSettings_fontOpacity' - Specifies the opacity of the burned-in captions. 255 is opaque; 0 is
-- transparent. All burn-in and DVB-Sub font settings must match.
--
-- 'fontResolution', 'dvbSubDestinationSettings_fontResolution' - Font resolution in DPI (dots per inch); default is 96 dpi. All burn-in
-- and DVB-Sub font settings must match.
--
-- 'fontSize', 'dvbSubDestinationSettings_fontSize' - When set to auto fontSize will scale depending on the size of the
-- output. Giving a positive integer will specify the exact font size in
-- points. All burn-in and DVB-Sub font settings must match.
--
-- 'outlineColor', 'dvbSubDestinationSettings_outlineColor' - Specifies font outline color. This option is not valid for source
-- captions that are either 608\/embedded or teletext. These source
-- settings are already pre-defined by the caption stream. All burn-in and
-- DVB-Sub font settings must match.
--
-- 'outlineSize', 'dvbSubDestinationSettings_outlineSize' - Specifies font outline size in pixels. This option is not valid for
-- source captions that are either 608\/embedded or teletext. These source
-- settings are already pre-defined by the caption stream. All burn-in and
-- DVB-Sub font settings must match.
--
-- 'shadowColor', 'dvbSubDestinationSettings_shadowColor' - Specifies the color of the shadow cast by the captions. All burn-in and
-- DVB-Sub font settings must match.
--
-- 'shadowOpacity', 'dvbSubDestinationSettings_shadowOpacity' - Specifies the opacity of the shadow. 255 is opaque; 0 is transparent.
-- Leaving this parameter blank is equivalent to setting it to 0
-- (transparent). All burn-in and DVB-Sub font settings must match.
--
-- 'shadowXOffset', 'dvbSubDestinationSettings_shadowXOffset' - Specifies 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. All burn-in and DVB-Sub font settings must match.
--
-- 'shadowYOffset', 'dvbSubDestinationSettings_shadowYOffset' - Specifies 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. All burn-in and DVB-Sub font settings must match.
--
-- 'teletextGridControl', 'dvbSubDestinationSettings_teletextGridControl' - Controls whether a fixed grid size will be used to generate the output
-- subtitles bitmap. Only applicable for Teletext inputs and
-- DVB-Sub\/Burn-in outputs.
--
-- 'xPosition', 'dvbSubDestinationSettings_xPosition' - Specifies the horizontal position of the caption 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 xPosition
-- is provided, the horizontal caption position will be determined by the
-- alignment parameter. This option is not valid for source captions that
-- are STL, 608\/embedded or teletext. These source settings are already
-- pre-defined by the caption stream. All burn-in and DVB-Sub font settings
-- must match.
--
-- 'yPosition', 'dvbSubDestinationSettings_yPosition' - Specifies the vertical position of the caption 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 yPosition
-- is provided, the caption will be positioned towards the bottom of the
-- output. This option is not valid for source captions that are STL,
-- 608\/embedded or teletext. These source settings are already pre-defined
-- by the caption stream. All burn-in and DVB-Sub font settings must match.
newDvbSubDestinationSettings ::
  DvbSubDestinationSettings
newDvbSubDestinationSettings :: DvbSubDestinationSettings
newDvbSubDestinationSettings =
  DvbSubDestinationSettings'
    { $sel:alignment:DvbSubDestinationSettings' :: Maybe DvbSubDestinationAlignment
alignment =
        forall a. Maybe a
Prelude.Nothing,
      $sel:backgroundColor:DvbSubDestinationSettings' :: Maybe DvbSubDestinationBackgroundColor
backgroundColor = forall a. Maybe a
Prelude.Nothing,
      $sel:backgroundOpacity:DvbSubDestinationSettings' :: Maybe Natural
backgroundOpacity = forall a. Maybe a
Prelude.Nothing,
      $sel:font:DvbSubDestinationSettings' :: Maybe InputLocation
font = forall a. Maybe a
Prelude.Nothing,
      $sel:fontColor:DvbSubDestinationSettings' :: Maybe DvbSubDestinationFontColor
fontColor = forall a. Maybe a
Prelude.Nothing,
      $sel:fontOpacity:DvbSubDestinationSettings' :: Maybe Natural
fontOpacity = forall a. Maybe a
Prelude.Nothing,
      $sel:fontResolution:DvbSubDestinationSettings' :: Maybe Natural
fontResolution = forall a. Maybe a
Prelude.Nothing,
      $sel:fontSize:DvbSubDestinationSettings' :: Maybe Text
fontSize = forall a. Maybe a
Prelude.Nothing,
      $sel:outlineColor:DvbSubDestinationSettings' :: Maybe DvbSubDestinationOutlineColor
outlineColor = forall a. Maybe a
Prelude.Nothing,
      $sel:outlineSize:DvbSubDestinationSettings' :: Maybe Natural
outlineSize = forall a. Maybe a
Prelude.Nothing,
      $sel:shadowColor:DvbSubDestinationSettings' :: Maybe DvbSubDestinationShadowColor
shadowColor = forall a. Maybe a
Prelude.Nothing,
      $sel:shadowOpacity:DvbSubDestinationSettings' :: Maybe Natural
shadowOpacity = forall a. Maybe a
Prelude.Nothing,
      $sel:shadowXOffset:DvbSubDestinationSettings' :: Maybe Int
shadowXOffset = forall a. Maybe a
Prelude.Nothing,
      $sel:shadowYOffset:DvbSubDestinationSettings' :: Maybe Int
shadowYOffset = forall a. Maybe a
Prelude.Nothing,
      $sel:teletextGridControl:DvbSubDestinationSettings' :: Maybe DvbSubDestinationTeletextGridControl
teletextGridControl = forall a. Maybe a
Prelude.Nothing,
      $sel:xPosition:DvbSubDestinationSettings' :: Maybe Natural
xPosition = forall a. Maybe a
Prelude.Nothing,
      $sel:yPosition:DvbSubDestinationSettings' :: Maybe Natural
yPosition = forall a. Maybe a
Prelude.Nothing
    }

-- | If no explicit xPosition or yPosition is provided, setting alignment to
-- centered will place the captions at the bottom center of the output.
-- Similarly, setting a left alignment will align 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. Selecting \"smart\"
-- justification will left-justify live subtitles and center-justify
-- pre-recorded subtitles. This option is not valid for source captions
-- that are STL or 608\/embedded. These source settings are already
-- pre-defined by the caption stream. All burn-in and DVB-Sub font settings
-- must match.
dvbSubDestinationSettings_alignment :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe DvbSubDestinationAlignment)
dvbSubDestinationSettings_alignment :: Lens' DvbSubDestinationSettings (Maybe DvbSubDestinationAlignment)
dvbSubDestinationSettings_alignment = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe DvbSubDestinationAlignment
alignment :: Maybe DvbSubDestinationAlignment
$sel:alignment:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationAlignment
alignment} -> Maybe DvbSubDestinationAlignment
alignment) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe DvbSubDestinationAlignment
a -> DvbSubDestinationSettings
s {$sel:alignment:DvbSubDestinationSettings' :: Maybe DvbSubDestinationAlignment
alignment = Maybe DvbSubDestinationAlignment
a} :: DvbSubDestinationSettings)

-- | Specifies the color of the rectangle behind the captions. All burn-in
-- and DVB-Sub font settings must match.
dvbSubDestinationSettings_backgroundColor :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe DvbSubDestinationBackgroundColor)
dvbSubDestinationSettings_backgroundColor :: Lens'
  DvbSubDestinationSettings (Maybe DvbSubDestinationBackgroundColor)
dvbSubDestinationSettings_backgroundColor = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe DvbSubDestinationBackgroundColor
backgroundColor :: Maybe DvbSubDestinationBackgroundColor
$sel:backgroundColor:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationBackgroundColor
backgroundColor} -> Maybe DvbSubDestinationBackgroundColor
backgroundColor) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe DvbSubDestinationBackgroundColor
a -> DvbSubDestinationSettings
s {$sel:backgroundColor:DvbSubDestinationSettings' :: Maybe DvbSubDestinationBackgroundColor
backgroundColor = Maybe DvbSubDestinationBackgroundColor
a} :: DvbSubDestinationSettings)

-- | Specifies the opacity of the background rectangle. 255 is opaque; 0 is
-- transparent. Leaving this parameter blank is equivalent to setting it to
-- 0 (transparent). All burn-in and DVB-Sub font settings must match.
dvbSubDestinationSettings_backgroundOpacity :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe Prelude.Natural)
dvbSubDestinationSettings_backgroundOpacity :: Lens' DvbSubDestinationSettings (Maybe Natural)
dvbSubDestinationSettings_backgroundOpacity = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe Natural
backgroundOpacity :: Maybe Natural
$sel:backgroundOpacity:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
backgroundOpacity} -> Maybe Natural
backgroundOpacity) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe Natural
a -> DvbSubDestinationSettings
s {$sel:backgroundOpacity:DvbSubDestinationSettings' :: Maybe Natural
backgroundOpacity = Maybe Natural
a} :: DvbSubDestinationSettings)

-- | External font file used for caption burn-in. File extension must be
-- \'ttf\' or \'tte\'. Although the user can select output fonts for many
-- different types of input captions, embedded, STL and teletext sources
-- use a strict grid system. Using external fonts with these caption
-- sources could cause unexpected display of proportional fonts. All
-- burn-in and DVB-Sub font settings must match.
dvbSubDestinationSettings_font :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe InputLocation)
dvbSubDestinationSettings_font :: Lens' DvbSubDestinationSettings (Maybe InputLocation)
dvbSubDestinationSettings_font = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe InputLocation
font :: Maybe InputLocation
$sel:font:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe InputLocation
font} -> Maybe InputLocation
font) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe InputLocation
a -> DvbSubDestinationSettings
s {$sel:font:DvbSubDestinationSettings' :: Maybe InputLocation
font = Maybe InputLocation
a} :: DvbSubDestinationSettings)

-- | Specifies the color of the burned-in captions. This option is not valid
-- for source captions that are STL, 608\/embedded or teletext. These
-- source settings are already pre-defined by the caption stream. All
-- burn-in and DVB-Sub font settings must match.
dvbSubDestinationSettings_fontColor :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe DvbSubDestinationFontColor)
dvbSubDestinationSettings_fontColor :: Lens' DvbSubDestinationSettings (Maybe DvbSubDestinationFontColor)
dvbSubDestinationSettings_fontColor = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe DvbSubDestinationFontColor
fontColor :: Maybe DvbSubDestinationFontColor
$sel:fontColor:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationFontColor
fontColor} -> Maybe DvbSubDestinationFontColor
fontColor) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe DvbSubDestinationFontColor
a -> DvbSubDestinationSettings
s {$sel:fontColor:DvbSubDestinationSettings' :: Maybe DvbSubDestinationFontColor
fontColor = Maybe DvbSubDestinationFontColor
a} :: DvbSubDestinationSettings)

-- | Specifies the opacity of the burned-in captions. 255 is opaque; 0 is
-- transparent. All burn-in and DVB-Sub font settings must match.
dvbSubDestinationSettings_fontOpacity :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe Prelude.Natural)
dvbSubDestinationSettings_fontOpacity :: Lens' DvbSubDestinationSettings (Maybe Natural)
dvbSubDestinationSettings_fontOpacity = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe Natural
fontOpacity :: Maybe Natural
$sel:fontOpacity:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
fontOpacity} -> Maybe Natural
fontOpacity) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe Natural
a -> DvbSubDestinationSettings
s {$sel:fontOpacity:DvbSubDestinationSettings' :: Maybe Natural
fontOpacity = Maybe Natural
a} :: DvbSubDestinationSettings)

-- | Font resolution in DPI (dots per inch); default is 96 dpi. All burn-in
-- and DVB-Sub font settings must match.
dvbSubDestinationSettings_fontResolution :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe Prelude.Natural)
dvbSubDestinationSettings_fontResolution :: Lens' DvbSubDestinationSettings (Maybe Natural)
dvbSubDestinationSettings_fontResolution = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe Natural
fontResolution :: Maybe Natural
$sel:fontResolution:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
fontResolution} -> Maybe Natural
fontResolution) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe Natural
a -> DvbSubDestinationSettings
s {$sel:fontResolution:DvbSubDestinationSettings' :: Maybe Natural
fontResolution = Maybe Natural
a} :: DvbSubDestinationSettings)

-- | When set to auto fontSize will scale depending on the size of the
-- output. Giving a positive integer will specify the exact font size in
-- points. All burn-in and DVB-Sub font settings must match.
dvbSubDestinationSettings_fontSize :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe Prelude.Text)
dvbSubDestinationSettings_fontSize :: Lens' DvbSubDestinationSettings (Maybe Text)
dvbSubDestinationSettings_fontSize = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe Text
fontSize :: Maybe Text
$sel:fontSize:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Text
fontSize} -> Maybe Text
fontSize) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe Text
a -> DvbSubDestinationSettings
s {$sel:fontSize:DvbSubDestinationSettings' :: Maybe Text
fontSize = Maybe Text
a} :: DvbSubDestinationSettings)

-- | Specifies font outline color. This option is not valid for source
-- captions that are either 608\/embedded or teletext. These source
-- settings are already pre-defined by the caption stream. All burn-in and
-- DVB-Sub font settings must match.
dvbSubDestinationSettings_outlineColor :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe DvbSubDestinationOutlineColor)
dvbSubDestinationSettings_outlineColor :: Lens'
  DvbSubDestinationSettings (Maybe DvbSubDestinationOutlineColor)
dvbSubDestinationSettings_outlineColor = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe DvbSubDestinationOutlineColor
outlineColor :: Maybe DvbSubDestinationOutlineColor
$sel:outlineColor:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationOutlineColor
outlineColor} -> Maybe DvbSubDestinationOutlineColor
outlineColor) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe DvbSubDestinationOutlineColor
a -> DvbSubDestinationSettings
s {$sel:outlineColor:DvbSubDestinationSettings' :: Maybe DvbSubDestinationOutlineColor
outlineColor = Maybe DvbSubDestinationOutlineColor
a} :: DvbSubDestinationSettings)

-- | Specifies font outline size in pixels. This option is not valid for
-- source captions that are either 608\/embedded or teletext. These source
-- settings are already pre-defined by the caption stream. All burn-in and
-- DVB-Sub font settings must match.
dvbSubDestinationSettings_outlineSize :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe Prelude.Natural)
dvbSubDestinationSettings_outlineSize :: Lens' DvbSubDestinationSettings (Maybe Natural)
dvbSubDestinationSettings_outlineSize = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe Natural
outlineSize :: Maybe Natural
$sel:outlineSize:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
outlineSize} -> Maybe Natural
outlineSize) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe Natural
a -> DvbSubDestinationSettings
s {$sel:outlineSize:DvbSubDestinationSettings' :: Maybe Natural
outlineSize = Maybe Natural
a} :: DvbSubDestinationSettings)

-- | Specifies the color of the shadow cast by the captions. All burn-in and
-- DVB-Sub font settings must match.
dvbSubDestinationSettings_shadowColor :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe DvbSubDestinationShadowColor)
dvbSubDestinationSettings_shadowColor :: Lens'
  DvbSubDestinationSettings (Maybe DvbSubDestinationShadowColor)
dvbSubDestinationSettings_shadowColor = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe DvbSubDestinationShadowColor
shadowColor :: Maybe DvbSubDestinationShadowColor
$sel:shadowColor:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationShadowColor
shadowColor} -> Maybe DvbSubDestinationShadowColor
shadowColor) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe DvbSubDestinationShadowColor
a -> DvbSubDestinationSettings
s {$sel:shadowColor:DvbSubDestinationSettings' :: Maybe DvbSubDestinationShadowColor
shadowColor = Maybe DvbSubDestinationShadowColor
a} :: DvbSubDestinationSettings)

-- | Specifies the opacity of the shadow. 255 is opaque; 0 is transparent.
-- Leaving this parameter blank is equivalent to setting it to 0
-- (transparent). All burn-in and DVB-Sub font settings must match.
dvbSubDestinationSettings_shadowOpacity :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe Prelude.Natural)
dvbSubDestinationSettings_shadowOpacity :: Lens' DvbSubDestinationSettings (Maybe Natural)
dvbSubDestinationSettings_shadowOpacity = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe Natural
shadowOpacity :: Maybe Natural
$sel:shadowOpacity:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
shadowOpacity} -> Maybe Natural
shadowOpacity) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe Natural
a -> DvbSubDestinationSettings
s {$sel:shadowOpacity:DvbSubDestinationSettings' :: Maybe Natural
shadowOpacity = Maybe Natural
a} :: DvbSubDestinationSettings)

-- | Specifies 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. All burn-in and DVB-Sub font settings must match.
dvbSubDestinationSettings_shadowXOffset :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe Prelude.Int)
dvbSubDestinationSettings_shadowXOffset :: Lens' DvbSubDestinationSettings (Maybe Int)
dvbSubDestinationSettings_shadowXOffset = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe Int
shadowXOffset :: Maybe Int
$sel:shadowXOffset:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Int
shadowXOffset} -> Maybe Int
shadowXOffset) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe Int
a -> DvbSubDestinationSettings
s {$sel:shadowXOffset:DvbSubDestinationSettings' :: Maybe Int
shadowXOffset = Maybe Int
a} :: DvbSubDestinationSettings)

-- | Specifies 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. All burn-in and DVB-Sub font settings must match.
dvbSubDestinationSettings_shadowYOffset :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe Prelude.Int)
dvbSubDestinationSettings_shadowYOffset :: Lens' DvbSubDestinationSettings (Maybe Int)
dvbSubDestinationSettings_shadowYOffset = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe Int
shadowYOffset :: Maybe Int
$sel:shadowYOffset:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Int
shadowYOffset} -> Maybe Int
shadowYOffset) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe Int
a -> DvbSubDestinationSettings
s {$sel:shadowYOffset:DvbSubDestinationSettings' :: Maybe Int
shadowYOffset = Maybe Int
a} :: DvbSubDestinationSettings)

-- | Controls whether a fixed grid size will be used to generate the output
-- subtitles bitmap. Only applicable for Teletext inputs and
-- DVB-Sub\/Burn-in outputs.
dvbSubDestinationSettings_teletextGridControl :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe DvbSubDestinationTeletextGridControl)
dvbSubDestinationSettings_teletextGridControl :: Lens'
  DvbSubDestinationSettings
  (Maybe DvbSubDestinationTeletextGridControl)
dvbSubDestinationSettings_teletextGridControl = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe DvbSubDestinationTeletextGridControl
teletextGridControl :: Maybe DvbSubDestinationTeletextGridControl
$sel:teletextGridControl:DvbSubDestinationSettings' :: DvbSubDestinationSettings
-> Maybe DvbSubDestinationTeletextGridControl
teletextGridControl} -> Maybe DvbSubDestinationTeletextGridControl
teletextGridControl) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe DvbSubDestinationTeletextGridControl
a -> DvbSubDestinationSettings
s {$sel:teletextGridControl:DvbSubDestinationSettings' :: Maybe DvbSubDestinationTeletextGridControl
teletextGridControl = Maybe DvbSubDestinationTeletextGridControl
a} :: DvbSubDestinationSettings)

-- | Specifies the horizontal position of the caption 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 xPosition
-- is provided, the horizontal caption position will be determined by the
-- alignment parameter. This option is not valid for source captions that
-- are STL, 608\/embedded or teletext. These source settings are already
-- pre-defined by the caption stream. All burn-in and DVB-Sub font settings
-- must match.
dvbSubDestinationSettings_xPosition :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe Prelude.Natural)
dvbSubDestinationSettings_xPosition :: Lens' DvbSubDestinationSettings (Maybe Natural)
dvbSubDestinationSettings_xPosition = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe Natural
xPosition :: Maybe Natural
$sel:xPosition:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
xPosition} -> Maybe Natural
xPosition) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe Natural
a -> DvbSubDestinationSettings
s {$sel:xPosition:DvbSubDestinationSettings' :: Maybe Natural
xPosition = Maybe Natural
a} :: DvbSubDestinationSettings)

-- | Specifies the vertical position of the caption 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 yPosition
-- is provided, the caption will be positioned towards the bottom of the
-- output. This option is not valid for source captions that are STL,
-- 608\/embedded or teletext. These source settings are already pre-defined
-- by the caption stream. All burn-in and DVB-Sub font settings must match.
dvbSubDestinationSettings_yPosition :: Lens.Lens' DvbSubDestinationSettings (Prelude.Maybe Prelude.Natural)
dvbSubDestinationSettings_yPosition :: Lens' DvbSubDestinationSettings (Maybe Natural)
dvbSubDestinationSettings_yPosition = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DvbSubDestinationSettings' {Maybe Natural
yPosition :: Maybe Natural
$sel:yPosition:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
yPosition} -> Maybe Natural
yPosition) (\s :: DvbSubDestinationSettings
s@DvbSubDestinationSettings' {} Maybe Natural
a -> DvbSubDestinationSettings
s {$sel:yPosition:DvbSubDestinationSettings' :: Maybe Natural
yPosition = Maybe Natural
a} :: DvbSubDestinationSettings)

instance Data.FromJSON DvbSubDestinationSettings where
  parseJSON :: Value -> Parser DvbSubDestinationSettings
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"DvbSubDestinationSettings"
      ( \Object
x ->
          Maybe DvbSubDestinationAlignment
-> Maybe DvbSubDestinationBackgroundColor
-> Maybe Natural
-> Maybe InputLocation
-> Maybe DvbSubDestinationFontColor
-> Maybe Natural
-> Maybe Natural
-> Maybe Text
-> Maybe DvbSubDestinationOutlineColor
-> Maybe Natural
-> Maybe DvbSubDestinationShadowColor
-> Maybe Natural
-> Maybe Int
-> Maybe Int
-> Maybe DvbSubDestinationTeletextGridControl
-> Maybe Natural
-> Maybe Natural
-> DvbSubDestinationSettings
DvbSubDestinationSettings'
            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
"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
"font")
            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
"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
"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
"teletextGridControl")
            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 DvbSubDestinationSettings where
  hashWithSalt :: Int -> DvbSubDestinationSettings -> Int
hashWithSalt Int
_salt DvbSubDestinationSettings' {Maybe Int
Maybe Natural
Maybe Text
Maybe DvbSubDestinationAlignment
Maybe DvbSubDestinationBackgroundColor
Maybe DvbSubDestinationFontColor
Maybe DvbSubDestinationOutlineColor
Maybe DvbSubDestinationShadowColor
Maybe DvbSubDestinationTeletextGridControl
Maybe InputLocation
yPosition :: Maybe Natural
xPosition :: Maybe Natural
teletextGridControl :: Maybe DvbSubDestinationTeletextGridControl
shadowYOffset :: Maybe Int
shadowXOffset :: Maybe Int
shadowOpacity :: Maybe Natural
shadowColor :: Maybe DvbSubDestinationShadowColor
outlineSize :: Maybe Natural
outlineColor :: Maybe DvbSubDestinationOutlineColor
fontSize :: Maybe Text
fontResolution :: Maybe Natural
fontOpacity :: Maybe Natural
fontColor :: Maybe DvbSubDestinationFontColor
font :: Maybe InputLocation
backgroundOpacity :: Maybe Natural
backgroundColor :: Maybe DvbSubDestinationBackgroundColor
alignment :: Maybe DvbSubDestinationAlignment
$sel:yPosition:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:xPosition:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:teletextGridControl:DvbSubDestinationSettings' :: DvbSubDestinationSettings
-> Maybe DvbSubDestinationTeletextGridControl
$sel:shadowYOffset:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Int
$sel:shadowXOffset:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Int
$sel:shadowOpacity:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:shadowColor:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationShadowColor
$sel:outlineSize:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:outlineColor:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationOutlineColor
$sel:fontSize:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Text
$sel:fontResolution:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:fontOpacity:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:fontColor:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationFontColor
$sel:font:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe InputLocation
$sel:backgroundOpacity:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:backgroundColor:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationBackgroundColor
$sel:alignment:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationAlignment
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe DvbSubDestinationAlignment
alignment
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe DvbSubDestinationBackgroundColor
backgroundColor
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
backgroundOpacity
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe InputLocation
font
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe DvbSubDestinationFontColor
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 Text
fontSize
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe DvbSubDestinationOutlineColor
outlineColor
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
outlineSize
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe DvbSubDestinationShadowColor
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 DvbSubDestinationTeletextGridControl
teletextGridControl
      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 DvbSubDestinationSettings where
  rnf :: DvbSubDestinationSettings -> ()
rnf DvbSubDestinationSettings' {Maybe Int
Maybe Natural
Maybe Text
Maybe DvbSubDestinationAlignment
Maybe DvbSubDestinationBackgroundColor
Maybe DvbSubDestinationFontColor
Maybe DvbSubDestinationOutlineColor
Maybe DvbSubDestinationShadowColor
Maybe DvbSubDestinationTeletextGridControl
Maybe InputLocation
yPosition :: Maybe Natural
xPosition :: Maybe Natural
teletextGridControl :: Maybe DvbSubDestinationTeletextGridControl
shadowYOffset :: Maybe Int
shadowXOffset :: Maybe Int
shadowOpacity :: Maybe Natural
shadowColor :: Maybe DvbSubDestinationShadowColor
outlineSize :: Maybe Natural
outlineColor :: Maybe DvbSubDestinationOutlineColor
fontSize :: Maybe Text
fontResolution :: Maybe Natural
fontOpacity :: Maybe Natural
fontColor :: Maybe DvbSubDestinationFontColor
font :: Maybe InputLocation
backgroundOpacity :: Maybe Natural
backgroundColor :: Maybe DvbSubDestinationBackgroundColor
alignment :: Maybe DvbSubDestinationAlignment
$sel:yPosition:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:xPosition:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:teletextGridControl:DvbSubDestinationSettings' :: DvbSubDestinationSettings
-> Maybe DvbSubDestinationTeletextGridControl
$sel:shadowYOffset:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Int
$sel:shadowXOffset:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Int
$sel:shadowOpacity:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:shadowColor:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationShadowColor
$sel:outlineSize:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:outlineColor:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationOutlineColor
$sel:fontSize:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Text
$sel:fontResolution:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:fontOpacity:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:fontColor:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationFontColor
$sel:font:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe InputLocation
$sel:backgroundOpacity:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:backgroundColor:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationBackgroundColor
$sel:alignment:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationAlignment
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe DvbSubDestinationAlignment
alignment
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe DvbSubDestinationBackgroundColor
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 InputLocation
font
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe DvbSubDestinationFontColor
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 Text
fontSize
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe DvbSubDestinationOutlineColor
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 DvbSubDestinationShadowColor
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 DvbSubDestinationTeletextGridControl
teletextGridControl
      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 DvbSubDestinationSettings where
  toJSON :: DvbSubDestinationSettings -> Value
toJSON DvbSubDestinationSettings' {Maybe Int
Maybe Natural
Maybe Text
Maybe DvbSubDestinationAlignment
Maybe DvbSubDestinationBackgroundColor
Maybe DvbSubDestinationFontColor
Maybe DvbSubDestinationOutlineColor
Maybe DvbSubDestinationShadowColor
Maybe DvbSubDestinationTeletextGridControl
Maybe InputLocation
yPosition :: Maybe Natural
xPosition :: Maybe Natural
teletextGridControl :: Maybe DvbSubDestinationTeletextGridControl
shadowYOffset :: Maybe Int
shadowXOffset :: Maybe Int
shadowOpacity :: Maybe Natural
shadowColor :: Maybe DvbSubDestinationShadowColor
outlineSize :: Maybe Natural
outlineColor :: Maybe DvbSubDestinationOutlineColor
fontSize :: Maybe Text
fontResolution :: Maybe Natural
fontOpacity :: Maybe Natural
fontColor :: Maybe DvbSubDestinationFontColor
font :: Maybe InputLocation
backgroundOpacity :: Maybe Natural
backgroundColor :: Maybe DvbSubDestinationBackgroundColor
alignment :: Maybe DvbSubDestinationAlignment
$sel:yPosition:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:xPosition:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:teletextGridControl:DvbSubDestinationSettings' :: DvbSubDestinationSettings
-> Maybe DvbSubDestinationTeletextGridControl
$sel:shadowYOffset:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Int
$sel:shadowXOffset:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Int
$sel:shadowOpacity:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:shadowColor:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationShadowColor
$sel:outlineSize:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:outlineColor:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationOutlineColor
$sel:fontSize:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Text
$sel:fontResolution:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:fontOpacity:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:fontColor:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationFontColor
$sel:font:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe InputLocation
$sel:backgroundOpacity:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe Natural
$sel:backgroundColor:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationBackgroundColor
$sel:alignment:DvbSubDestinationSettings' :: DvbSubDestinationSettings -> Maybe DvbSubDestinationAlignment
..} =
    [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 DvbSubDestinationAlignment
alignment,
            (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 DvbSubDestinationBackgroundColor
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
"font" 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 InputLocation
font,
            (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 DvbSubDestinationFontColor
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
"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 Text
fontSize,
            (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 DvbSubDestinationOutlineColor
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 DvbSubDestinationShadowColor
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
"teletextGridControl" 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 DvbSubDestinationTeletextGridControl
teletextGridControl,
            (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
          ]
      )