{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}
module Amazonka.Transcribe.Types.TranscriptionJob where
import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude
import Amazonka.Transcribe.Types.ContentRedaction
import Amazonka.Transcribe.Types.JobExecutionSettings
import Amazonka.Transcribe.Types.LanguageCode
import Amazonka.Transcribe.Types.LanguageCodeItem
import Amazonka.Transcribe.Types.LanguageIdSettings
import Amazonka.Transcribe.Types.Media
import Amazonka.Transcribe.Types.MediaFormat
import Amazonka.Transcribe.Types.ModelSettings
import Amazonka.Transcribe.Types.Settings
import Amazonka.Transcribe.Types.SubtitlesOutput
import Amazonka.Transcribe.Types.Tag
import Amazonka.Transcribe.Types.Transcript
import Amazonka.Transcribe.Types.TranscriptionJobStatus
data TranscriptionJob = TranscriptionJob'
{
TranscriptionJob -> Maybe POSIX
completionTime :: Prelude.Maybe Data.POSIX,
TranscriptionJob -> Maybe ContentRedaction
contentRedaction :: Prelude.Maybe ContentRedaction,
TranscriptionJob -> Maybe POSIX
creationTime :: Prelude.Maybe Data.POSIX,
TranscriptionJob -> Maybe Text
failureReason :: Prelude.Maybe Prelude.Text,
TranscriptionJob -> Maybe Double
identifiedLanguageScore :: Prelude.Maybe Prelude.Double,
TranscriptionJob -> Maybe Bool
identifyLanguage :: Prelude.Maybe Prelude.Bool,
TranscriptionJob -> Maybe Bool
identifyMultipleLanguages :: Prelude.Maybe Prelude.Bool,
TranscriptionJob -> Maybe JobExecutionSettings
jobExecutionSettings :: Prelude.Maybe JobExecutionSettings,
TranscriptionJob -> Maybe LanguageCode
languageCode :: Prelude.Maybe LanguageCode,
TranscriptionJob -> Maybe [LanguageCodeItem]
languageCodes :: Prelude.Maybe [LanguageCodeItem],
TranscriptionJob -> Maybe (HashMap LanguageCode LanguageIdSettings)
languageIdSettings :: Prelude.Maybe (Prelude.HashMap LanguageCode LanguageIdSettings),
TranscriptionJob -> Maybe (NonEmpty LanguageCode)
languageOptions :: Prelude.Maybe (Prelude.NonEmpty LanguageCode),
TranscriptionJob -> Maybe Media
media :: Prelude.Maybe Media,
TranscriptionJob -> Maybe MediaFormat
mediaFormat :: Prelude.Maybe MediaFormat,
TranscriptionJob -> Maybe Natural
mediaSampleRateHertz :: Prelude.Maybe Prelude.Natural,
TranscriptionJob -> Maybe ModelSettings
modelSettings :: Prelude.Maybe ModelSettings,
TranscriptionJob -> Maybe Settings
settings :: Prelude.Maybe Settings,
TranscriptionJob -> Maybe POSIX
startTime :: Prelude.Maybe Data.POSIX,
TranscriptionJob -> Maybe SubtitlesOutput
subtitles :: Prelude.Maybe SubtitlesOutput,
TranscriptionJob -> Maybe (NonEmpty Tag)
tags :: Prelude.Maybe (Prelude.NonEmpty Tag),
TranscriptionJob -> Maybe Transcript
transcript :: Prelude.Maybe Transcript,
TranscriptionJob -> Maybe Text
transcriptionJobName :: Prelude.Maybe Prelude.Text,
TranscriptionJob -> Maybe TranscriptionJobStatus
transcriptionJobStatus :: Prelude.Maybe TranscriptionJobStatus
}
deriving (TranscriptionJob -> TranscriptionJob -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: TranscriptionJob -> TranscriptionJob -> Bool
$c/= :: TranscriptionJob -> TranscriptionJob -> Bool
== :: TranscriptionJob -> TranscriptionJob -> Bool
$c== :: TranscriptionJob -> TranscriptionJob -> Bool
Prelude.Eq, ReadPrec [TranscriptionJob]
ReadPrec TranscriptionJob
Int -> ReadS TranscriptionJob
ReadS [TranscriptionJob]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [TranscriptionJob]
$creadListPrec :: ReadPrec [TranscriptionJob]
readPrec :: ReadPrec TranscriptionJob
$creadPrec :: ReadPrec TranscriptionJob
readList :: ReadS [TranscriptionJob]
$creadList :: ReadS [TranscriptionJob]
readsPrec :: Int -> ReadS TranscriptionJob
$creadsPrec :: Int -> ReadS TranscriptionJob
Prelude.Read, Int -> TranscriptionJob -> ShowS
[TranscriptionJob] -> ShowS
TranscriptionJob -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [TranscriptionJob] -> ShowS
$cshowList :: [TranscriptionJob] -> ShowS
show :: TranscriptionJob -> String
$cshow :: TranscriptionJob -> String
showsPrec :: Int -> TranscriptionJob -> ShowS
$cshowsPrec :: Int -> TranscriptionJob -> ShowS
Prelude.Show, forall x. Rep TranscriptionJob x -> TranscriptionJob
forall x. TranscriptionJob -> Rep TranscriptionJob x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep TranscriptionJob x -> TranscriptionJob
$cfrom :: forall x. TranscriptionJob -> Rep TranscriptionJob x
Prelude.Generic)
newTranscriptionJob ::
TranscriptionJob
newTranscriptionJob :: TranscriptionJob
newTranscriptionJob =
TranscriptionJob'
{ $sel:completionTime:TranscriptionJob' :: Maybe POSIX
completionTime = forall a. Maybe a
Prelude.Nothing,
$sel:contentRedaction:TranscriptionJob' :: Maybe ContentRedaction
contentRedaction = forall a. Maybe a
Prelude.Nothing,
$sel:creationTime:TranscriptionJob' :: Maybe POSIX
creationTime = forall a. Maybe a
Prelude.Nothing,
$sel:failureReason:TranscriptionJob' :: Maybe Text
failureReason = forall a. Maybe a
Prelude.Nothing,
$sel:identifiedLanguageScore:TranscriptionJob' :: Maybe Double
identifiedLanguageScore = forall a. Maybe a
Prelude.Nothing,
$sel:identifyLanguage:TranscriptionJob' :: Maybe Bool
identifyLanguage = forall a. Maybe a
Prelude.Nothing,
$sel:identifyMultipleLanguages:TranscriptionJob' :: Maybe Bool
identifyMultipleLanguages = forall a. Maybe a
Prelude.Nothing,
$sel:jobExecutionSettings:TranscriptionJob' :: Maybe JobExecutionSettings
jobExecutionSettings = forall a. Maybe a
Prelude.Nothing,
$sel:languageCode:TranscriptionJob' :: Maybe LanguageCode
languageCode = forall a. Maybe a
Prelude.Nothing,
$sel:languageCodes:TranscriptionJob' :: Maybe [LanguageCodeItem]
languageCodes = forall a. Maybe a
Prelude.Nothing,
$sel:languageIdSettings:TranscriptionJob' :: Maybe (HashMap LanguageCode LanguageIdSettings)
languageIdSettings = forall a. Maybe a
Prelude.Nothing,
$sel:languageOptions:TranscriptionJob' :: Maybe (NonEmpty LanguageCode)
languageOptions = forall a. Maybe a
Prelude.Nothing,
$sel:media:TranscriptionJob' :: Maybe Media
media = forall a. Maybe a
Prelude.Nothing,
$sel:mediaFormat:TranscriptionJob' :: Maybe MediaFormat
mediaFormat = forall a. Maybe a
Prelude.Nothing,
$sel:mediaSampleRateHertz:TranscriptionJob' :: Maybe Natural
mediaSampleRateHertz = forall a. Maybe a
Prelude.Nothing,
$sel:modelSettings:TranscriptionJob' :: Maybe ModelSettings
modelSettings = forall a. Maybe a
Prelude.Nothing,
$sel:settings:TranscriptionJob' :: Maybe Settings
settings = forall a. Maybe a
Prelude.Nothing,
$sel:startTime:TranscriptionJob' :: Maybe POSIX
startTime = forall a. Maybe a
Prelude.Nothing,
$sel:subtitles:TranscriptionJob' :: Maybe SubtitlesOutput
subtitles = forall a. Maybe a
Prelude.Nothing,
$sel:tags:TranscriptionJob' :: Maybe (NonEmpty Tag)
tags = forall a. Maybe a
Prelude.Nothing,
$sel:transcript:TranscriptionJob' :: Maybe Transcript
transcript = forall a. Maybe a
Prelude.Nothing,
$sel:transcriptionJobName:TranscriptionJob' :: Maybe Text
transcriptionJobName = forall a. Maybe a
Prelude.Nothing,
$sel:transcriptionJobStatus:TranscriptionJob' :: Maybe TranscriptionJobStatus
transcriptionJobStatus = forall a. Maybe a
Prelude.Nothing
}
transcriptionJob_completionTime :: Lens.Lens' TranscriptionJob (Prelude.Maybe Prelude.UTCTime)
transcriptionJob_completionTime :: Lens' TranscriptionJob (Maybe UTCTime)
transcriptionJob_completionTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe POSIX
completionTime :: Maybe POSIX
$sel:completionTime:TranscriptionJob' :: TranscriptionJob -> Maybe POSIX
completionTime} -> Maybe POSIX
completionTime) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe POSIX
a -> TranscriptionJob
s {$sel:completionTime:TranscriptionJob' :: Maybe POSIX
completionTime = Maybe POSIX
a} :: TranscriptionJob) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall (a :: Format). Iso' (Time a) UTCTime
Data._Time
transcriptionJob_contentRedaction :: Lens.Lens' TranscriptionJob (Prelude.Maybe ContentRedaction)
transcriptionJob_contentRedaction :: Lens' TranscriptionJob (Maybe ContentRedaction)
transcriptionJob_contentRedaction = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe ContentRedaction
contentRedaction :: Maybe ContentRedaction
$sel:contentRedaction:TranscriptionJob' :: TranscriptionJob -> Maybe ContentRedaction
contentRedaction} -> Maybe ContentRedaction
contentRedaction) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe ContentRedaction
a -> TranscriptionJob
s {$sel:contentRedaction:TranscriptionJob' :: Maybe ContentRedaction
contentRedaction = Maybe ContentRedaction
a} :: TranscriptionJob)
transcriptionJob_creationTime :: Lens.Lens' TranscriptionJob (Prelude.Maybe Prelude.UTCTime)
transcriptionJob_creationTime :: Lens' TranscriptionJob (Maybe UTCTime)
transcriptionJob_creationTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe POSIX
creationTime :: Maybe POSIX
$sel:creationTime:TranscriptionJob' :: TranscriptionJob -> Maybe POSIX
creationTime} -> Maybe POSIX
creationTime) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe POSIX
a -> TranscriptionJob
s {$sel:creationTime:TranscriptionJob' :: Maybe POSIX
creationTime = Maybe POSIX
a} :: TranscriptionJob) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall (a :: Format). Iso' (Time a) UTCTime
Data._Time
transcriptionJob_failureReason :: Lens.Lens' TranscriptionJob (Prelude.Maybe Prelude.Text)
transcriptionJob_failureReason :: Lens' TranscriptionJob (Maybe Text)
transcriptionJob_failureReason = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe Text
failureReason :: Maybe Text
$sel:failureReason:TranscriptionJob' :: TranscriptionJob -> Maybe Text
failureReason} -> Maybe Text
failureReason) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe Text
a -> TranscriptionJob
s {$sel:failureReason:TranscriptionJob' :: Maybe Text
failureReason = Maybe Text
a} :: TranscriptionJob)
transcriptionJob_identifiedLanguageScore :: Lens.Lens' TranscriptionJob (Prelude.Maybe Prelude.Double)
transcriptionJob_identifiedLanguageScore :: Lens' TranscriptionJob (Maybe Double)
transcriptionJob_identifiedLanguageScore = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe Double
identifiedLanguageScore :: Maybe Double
$sel:identifiedLanguageScore:TranscriptionJob' :: TranscriptionJob -> Maybe Double
identifiedLanguageScore} -> Maybe Double
identifiedLanguageScore) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe Double
a -> TranscriptionJob
s {$sel:identifiedLanguageScore:TranscriptionJob' :: Maybe Double
identifiedLanguageScore = Maybe Double
a} :: TranscriptionJob)
transcriptionJob_identifyLanguage :: Lens.Lens' TranscriptionJob (Prelude.Maybe Prelude.Bool)
transcriptionJob_identifyLanguage :: Lens' TranscriptionJob (Maybe Bool)
transcriptionJob_identifyLanguage = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe Bool
identifyLanguage :: Maybe Bool
$sel:identifyLanguage:TranscriptionJob' :: TranscriptionJob -> Maybe Bool
identifyLanguage} -> Maybe Bool
identifyLanguage) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe Bool
a -> TranscriptionJob
s {$sel:identifyLanguage:TranscriptionJob' :: Maybe Bool
identifyLanguage = Maybe Bool
a} :: TranscriptionJob)
transcriptionJob_identifyMultipleLanguages :: Lens.Lens' TranscriptionJob (Prelude.Maybe Prelude.Bool)
transcriptionJob_identifyMultipleLanguages :: Lens' TranscriptionJob (Maybe Bool)
transcriptionJob_identifyMultipleLanguages = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe Bool
identifyMultipleLanguages :: Maybe Bool
$sel:identifyMultipleLanguages:TranscriptionJob' :: TranscriptionJob -> Maybe Bool
identifyMultipleLanguages} -> Maybe Bool
identifyMultipleLanguages) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe Bool
a -> TranscriptionJob
s {$sel:identifyMultipleLanguages:TranscriptionJob' :: Maybe Bool
identifyMultipleLanguages = Maybe Bool
a} :: TranscriptionJob)
transcriptionJob_jobExecutionSettings :: Lens.Lens' TranscriptionJob (Prelude.Maybe JobExecutionSettings)
transcriptionJob_jobExecutionSettings :: Lens' TranscriptionJob (Maybe JobExecutionSettings)
transcriptionJob_jobExecutionSettings = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe JobExecutionSettings
jobExecutionSettings :: Maybe JobExecutionSettings
$sel:jobExecutionSettings:TranscriptionJob' :: TranscriptionJob -> Maybe JobExecutionSettings
jobExecutionSettings} -> Maybe JobExecutionSettings
jobExecutionSettings) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe JobExecutionSettings
a -> TranscriptionJob
s {$sel:jobExecutionSettings:TranscriptionJob' :: Maybe JobExecutionSettings
jobExecutionSettings = Maybe JobExecutionSettings
a} :: TranscriptionJob)
transcriptionJob_languageCode :: Lens.Lens' TranscriptionJob (Prelude.Maybe LanguageCode)
transcriptionJob_languageCode :: Lens' TranscriptionJob (Maybe LanguageCode)
transcriptionJob_languageCode = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe LanguageCode
languageCode :: Maybe LanguageCode
$sel:languageCode:TranscriptionJob' :: TranscriptionJob -> Maybe LanguageCode
languageCode} -> Maybe LanguageCode
languageCode) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe LanguageCode
a -> TranscriptionJob
s {$sel:languageCode:TranscriptionJob' :: Maybe LanguageCode
languageCode = Maybe LanguageCode
a} :: TranscriptionJob)
transcriptionJob_languageCodes :: Lens.Lens' TranscriptionJob (Prelude.Maybe [LanguageCodeItem])
transcriptionJob_languageCodes :: Lens' TranscriptionJob (Maybe [LanguageCodeItem])
transcriptionJob_languageCodes = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe [LanguageCodeItem]
languageCodes :: Maybe [LanguageCodeItem]
$sel:languageCodes:TranscriptionJob' :: TranscriptionJob -> Maybe [LanguageCodeItem]
languageCodes} -> Maybe [LanguageCodeItem]
languageCodes) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe [LanguageCodeItem]
a -> TranscriptionJob
s {$sel:languageCodes:TranscriptionJob' :: Maybe [LanguageCodeItem]
languageCodes = Maybe [LanguageCodeItem]
a} :: TranscriptionJob) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced
transcriptionJob_languageIdSettings :: Lens.Lens' TranscriptionJob (Prelude.Maybe (Prelude.HashMap LanguageCode LanguageIdSettings))
transcriptionJob_languageIdSettings :: Lens'
TranscriptionJob (Maybe (HashMap LanguageCode LanguageIdSettings))
transcriptionJob_languageIdSettings = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe (HashMap LanguageCode LanguageIdSettings)
languageIdSettings :: Maybe (HashMap LanguageCode LanguageIdSettings)
$sel:languageIdSettings:TranscriptionJob' :: TranscriptionJob -> Maybe (HashMap LanguageCode LanguageIdSettings)
languageIdSettings} -> Maybe (HashMap LanguageCode LanguageIdSettings)
languageIdSettings) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe (HashMap LanguageCode LanguageIdSettings)
a -> TranscriptionJob
s {$sel:languageIdSettings:TranscriptionJob' :: Maybe (HashMap LanguageCode LanguageIdSettings)
languageIdSettings = Maybe (HashMap LanguageCode LanguageIdSettings)
a} :: TranscriptionJob) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced
transcriptionJob_languageOptions :: Lens.Lens' TranscriptionJob (Prelude.Maybe (Prelude.NonEmpty LanguageCode))
transcriptionJob_languageOptions :: Lens' TranscriptionJob (Maybe (NonEmpty LanguageCode))
transcriptionJob_languageOptions = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe (NonEmpty LanguageCode)
languageOptions :: Maybe (NonEmpty LanguageCode)
$sel:languageOptions:TranscriptionJob' :: TranscriptionJob -> Maybe (NonEmpty LanguageCode)
languageOptions} -> Maybe (NonEmpty LanguageCode)
languageOptions) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe (NonEmpty LanguageCode)
a -> TranscriptionJob
s {$sel:languageOptions:TranscriptionJob' :: Maybe (NonEmpty LanguageCode)
languageOptions = Maybe (NonEmpty LanguageCode)
a} :: TranscriptionJob) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced
transcriptionJob_media :: Lens.Lens' TranscriptionJob (Prelude.Maybe Media)
transcriptionJob_media :: Lens' TranscriptionJob (Maybe Media)
transcriptionJob_media = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe Media
media :: Maybe Media
$sel:media:TranscriptionJob' :: TranscriptionJob -> Maybe Media
media} -> Maybe Media
media) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe Media
a -> TranscriptionJob
s {$sel:media:TranscriptionJob' :: Maybe Media
media = Maybe Media
a} :: TranscriptionJob)
transcriptionJob_mediaFormat :: Lens.Lens' TranscriptionJob (Prelude.Maybe MediaFormat)
transcriptionJob_mediaFormat :: Lens' TranscriptionJob (Maybe MediaFormat)
transcriptionJob_mediaFormat = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe MediaFormat
mediaFormat :: Maybe MediaFormat
$sel:mediaFormat:TranscriptionJob' :: TranscriptionJob -> Maybe MediaFormat
mediaFormat} -> Maybe MediaFormat
mediaFormat) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe MediaFormat
a -> TranscriptionJob
s {$sel:mediaFormat:TranscriptionJob' :: Maybe MediaFormat
mediaFormat = Maybe MediaFormat
a} :: TranscriptionJob)
transcriptionJob_mediaSampleRateHertz :: Lens.Lens' TranscriptionJob (Prelude.Maybe Prelude.Natural)
transcriptionJob_mediaSampleRateHertz :: Lens' TranscriptionJob (Maybe Natural)
transcriptionJob_mediaSampleRateHertz = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe Natural
mediaSampleRateHertz :: Maybe Natural
$sel:mediaSampleRateHertz:TranscriptionJob' :: TranscriptionJob -> Maybe Natural
mediaSampleRateHertz} -> Maybe Natural
mediaSampleRateHertz) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe Natural
a -> TranscriptionJob
s {$sel:mediaSampleRateHertz:TranscriptionJob' :: Maybe Natural
mediaSampleRateHertz = Maybe Natural
a} :: TranscriptionJob)
transcriptionJob_modelSettings :: Lens.Lens' TranscriptionJob (Prelude.Maybe ModelSettings)
transcriptionJob_modelSettings :: Lens' TranscriptionJob (Maybe ModelSettings)
transcriptionJob_modelSettings = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe ModelSettings
modelSettings :: Maybe ModelSettings
$sel:modelSettings:TranscriptionJob' :: TranscriptionJob -> Maybe ModelSettings
modelSettings} -> Maybe ModelSettings
modelSettings) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe ModelSettings
a -> TranscriptionJob
s {$sel:modelSettings:TranscriptionJob' :: Maybe ModelSettings
modelSettings = Maybe ModelSettings
a} :: TranscriptionJob)
transcriptionJob_settings :: Lens.Lens' TranscriptionJob (Prelude.Maybe Settings)
transcriptionJob_settings :: Lens' TranscriptionJob (Maybe Settings)
transcriptionJob_settings = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe Settings
settings :: Maybe Settings
$sel:settings:TranscriptionJob' :: TranscriptionJob -> Maybe Settings
settings} -> Maybe Settings
settings) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe Settings
a -> TranscriptionJob
s {$sel:settings:TranscriptionJob' :: Maybe Settings
settings = Maybe Settings
a} :: TranscriptionJob)
transcriptionJob_startTime :: Lens.Lens' TranscriptionJob (Prelude.Maybe Prelude.UTCTime)
transcriptionJob_startTime :: Lens' TranscriptionJob (Maybe UTCTime)
transcriptionJob_startTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe POSIX
startTime :: Maybe POSIX
$sel:startTime:TranscriptionJob' :: TranscriptionJob -> Maybe POSIX
startTime} -> Maybe POSIX
startTime) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe POSIX
a -> TranscriptionJob
s {$sel:startTime:TranscriptionJob' :: Maybe POSIX
startTime = Maybe POSIX
a} :: TranscriptionJob) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall (a :: Format). Iso' (Time a) UTCTime
Data._Time
transcriptionJob_subtitles :: Lens.Lens' TranscriptionJob (Prelude.Maybe SubtitlesOutput)
transcriptionJob_subtitles :: Lens' TranscriptionJob (Maybe SubtitlesOutput)
transcriptionJob_subtitles = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe SubtitlesOutput
subtitles :: Maybe SubtitlesOutput
$sel:subtitles:TranscriptionJob' :: TranscriptionJob -> Maybe SubtitlesOutput
subtitles} -> Maybe SubtitlesOutput
subtitles) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe SubtitlesOutput
a -> TranscriptionJob
s {$sel:subtitles:TranscriptionJob' :: Maybe SubtitlesOutput
subtitles = Maybe SubtitlesOutput
a} :: TranscriptionJob)
transcriptionJob_tags :: Lens.Lens' TranscriptionJob (Prelude.Maybe (Prelude.NonEmpty Tag))
transcriptionJob_tags :: Lens' TranscriptionJob (Maybe (NonEmpty Tag))
transcriptionJob_tags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe (NonEmpty Tag)
tags :: Maybe (NonEmpty Tag)
$sel:tags:TranscriptionJob' :: TranscriptionJob -> Maybe (NonEmpty Tag)
tags} -> Maybe (NonEmpty Tag)
tags) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe (NonEmpty Tag)
a -> TranscriptionJob
s {$sel:tags:TranscriptionJob' :: Maybe (NonEmpty Tag)
tags = Maybe (NonEmpty Tag)
a} :: TranscriptionJob) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced
transcriptionJob_transcript :: Lens.Lens' TranscriptionJob (Prelude.Maybe Transcript)
transcriptionJob_transcript :: Lens' TranscriptionJob (Maybe Transcript)
transcriptionJob_transcript = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe Transcript
transcript :: Maybe Transcript
$sel:transcript:TranscriptionJob' :: TranscriptionJob -> Maybe Transcript
transcript} -> Maybe Transcript
transcript) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe Transcript
a -> TranscriptionJob
s {$sel:transcript:TranscriptionJob' :: Maybe Transcript
transcript = Maybe Transcript
a} :: TranscriptionJob)
transcriptionJob_transcriptionJobName :: Lens.Lens' TranscriptionJob (Prelude.Maybe Prelude.Text)
transcriptionJob_transcriptionJobName :: Lens' TranscriptionJob (Maybe Text)
transcriptionJob_transcriptionJobName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe Text
transcriptionJobName :: Maybe Text
$sel:transcriptionJobName:TranscriptionJob' :: TranscriptionJob -> Maybe Text
transcriptionJobName} -> Maybe Text
transcriptionJobName) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe Text
a -> TranscriptionJob
s {$sel:transcriptionJobName:TranscriptionJob' :: Maybe Text
transcriptionJobName = Maybe Text
a} :: TranscriptionJob)
transcriptionJob_transcriptionJobStatus :: Lens.Lens' TranscriptionJob (Prelude.Maybe TranscriptionJobStatus)
transcriptionJob_transcriptionJobStatus :: Lens' TranscriptionJob (Maybe TranscriptionJobStatus)
transcriptionJob_transcriptionJobStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TranscriptionJob' {Maybe TranscriptionJobStatus
transcriptionJobStatus :: Maybe TranscriptionJobStatus
$sel:transcriptionJobStatus:TranscriptionJob' :: TranscriptionJob -> Maybe TranscriptionJobStatus
transcriptionJobStatus} -> Maybe TranscriptionJobStatus
transcriptionJobStatus) (\s :: TranscriptionJob
s@TranscriptionJob' {} Maybe TranscriptionJobStatus
a -> TranscriptionJob
s {$sel:transcriptionJobStatus:TranscriptionJob' :: Maybe TranscriptionJobStatus
transcriptionJobStatus = Maybe TranscriptionJobStatus
a} :: TranscriptionJob)
instance Data.FromJSON TranscriptionJob where
parseJSON :: Value -> Parser TranscriptionJob
parseJSON =
forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
String
"TranscriptionJob"
( \Object
x ->
Maybe POSIX
-> Maybe ContentRedaction
-> Maybe POSIX
-> Maybe Text
-> Maybe Double
-> Maybe Bool
-> Maybe Bool
-> Maybe JobExecutionSettings
-> Maybe LanguageCode
-> Maybe [LanguageCodeItem]
-> Maybe (HashMap LanguageCode LanguageIdSettings)
-> Maybe (NonEmpty LanguageCode)
-> Maybe Media
-> Maybe MediaFormat
-> Maybe Natural
-> Maybe ModelSettings
-> Maybe Settings
-> Maybe POSIX
-> Maybe SubtitlesOutput
-> Maybe (NonEmpty Tag)
-> Maybe Transcript
-> Maybe Text
-> Maybe TranscriptionJobStatus
-> TranscriptionJob
TranscriptionJob'
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
"CompletionTime")
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
"ContentRedaction")
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
"CreationTime")
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
"FailureReason")
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
"IdentifiedLanguageScore")
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
"IdentifyLanguage")
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
"IdentifyMultipleLanguages")
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
"JobExecutionSettings")
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
"LanguageCode")
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
"LanguageCodes" forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty)
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
"LanguageIdSettings"
forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty
)
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
"LanguageOptions")
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
"Media")
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
"MediaFormat")
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
"MediaSampleRateHertz")
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
"ModelSettings")
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
"Settings")
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
"StartTime")
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
"Subtitles")
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
"Tags")
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
"Transcript")
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
"TranscriptionJobName")
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
"TranscriptionJobStatus")
)
instance Prelude.Hashable TranscriptionJob where
hashWithSalt :: Int -> TranscriptionJob -> Int
hashWithSalt Int
_salt TranscriptionJob' {Maybe Bool
Maybe Double
Maybe Natural
Maybe [LanguageCodeItem]
Maybe (NonEmpty LanguageCode)
Maybe (NonEmpty Tag)
Maybe Text
Maybe (HashMap LanguageCode LanguageIdSettings)
Maybe POSIX
Maybe JobExecutionSettings
Maybe LanguageCode
Maybe Media
Maybe MediaFormat
Maybe ModelSettings
Maybe ContentRedaction
Maybe SubtitlesOutput
Maybe Transcript
Maybe TranscriptionJobStatus
Maybe Settings
transcriptionJobStatus :: Maybe TranscriptionJobStatus
transcriptionJobName :: Maybe Text
transcript :: Maybe Transcript
tags :: Maybe (NonEmpty Tag)
subtitles :: Maybe SubtitlesOutput
startTime :: Maybe POSIX
settings :: Maybe Settings
modelSettings :: Maybe ModelSettings
mediaSampleRateHertz :: Maybe Natural
mediaFormat :: Maybe MediaFormat
media :: Maybe Media
languageOptions :: Maybe (NonEmpty LanguageCode)
languageIdSettings :: Maybe (HashMap LanguageCode LanguageIdSettings)
languageCodes :: Maybe [LanguageCodeItem]
languageCode :: Maybe LanguageCode
jobExecutionSettings :: Maybe JobExecutionSettings
identifyMultipleLanguages :: Maybe Bool
identifyLanguage :: Maybe Bool
identifiedLanguageScore :: Maybe Double
failureReason :: Maybe Text
creationTime :: Maybe POSIX
contentRedaction :: Maybe ContentRedaction
completionTime :: Maybe POSIX
$sel:transcriptionJobStatus:TranscriptionJob' :: TranscriptionJob -> Maybe TranscriptionJobStatus
$sel:transcriptionJobName:TranscriptionJob' :: TranscriptionJob -> Maybe Text
$sel:transcript:TranscriptionJob' :: TranscriptionJob -> Maybe Transcript
$sel:tags:TranscriptionJob' :: TranscriptionJob -> Maybe (NonEmpty Tag)
$sel:subtitles:TranscriptionJob' :: TranscriptionJob -> Maybe SubtitlesOutput
$sel:startTime:TranscriptionJob' :: TranscriptionJob -> Maybe POSIX
$sel:settings:TranscriptionJob' :: TranscriptionJob -> Maybe Settings
$sel:modelSettings:TranscriptionJob' :: TranscriptionJob -> Maybe ModelSettings
$sel:mediaSampleRateHertz:TranscriptionJob' :: TranscriptionJob -> Maybe Natural
$sel:mediaFormat:TranscriptionJob' :: TranscriptionJob -> Maybe MediaFormat
$sel:media:TranscriptionJob' :: TranscriptionJob -> Maybe Media
$sel:languageOptions:TranscriptionJob' :: TranscriptionJob -> Maybe (NonEmpty LanguageCode)
$sel:languageIdSettings:TranscriptionJob' :: TranscriptionJob -> Maybe (HashMap LanguageCode LanguageIdSettings)
$sel:languageCodes:TranscriptionJob' :: TranscriptionJob -> Maybe [LanguageCodeItem]
$sel:languageCode:TranscriptionJob' :: TranscriptionJob -> Maybe LanguageCode
$sel:jobExecutionSettings:TranscriptionJob' :: TranscriptionJob -> Maybe JobExecutionSettings
$sel:identifyMultipleLanguages:TranscriptionJob' :: TranscriptionJob -> Maybe Bool
$sel:identifyLanguage:TranscriptionJob' :: TranscriptionJob -> Maybe Bool
$sel:identifiedLanguageScore:TranscriptionJob' :: TranscriptionJob -> Maybe Double
$sel:failureReason:TranscriptionJob' :: TranscriptionJob -> Maybe Text
$sel:creationTime:TranscriptionJob' :: TranscriptionJob -> Maybe POSIX
$sel:contentRedaction:TranscriptionJob' :: TranscriptionJob -> Maybe ContentRedaction
$sel:completionTime:TranscriptionJob' :: TranscriptionJob -> Maybe POSIX
..} =
Int
_salt
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
completionTime
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe ContentRedaction
contentRedaction
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
creationTime
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
failureReason
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Double
identifiedLanguageScore
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
identifyLanguage
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
identifyMultipleLanguages
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe JobExecutionSettings
jobExecutionSettings
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe LanguageCode
languageCode
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [LanguageCodeItem]
languageCodes
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe (HashMap LanguageCode LanguageIdSettings)
languageIdSettings
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe (NonEmpty LanguageCode)
languageOptions
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Media
media
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe MediaFormat
mediaFormat
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
mediaSampleRateHertz
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe ModelSettings
modelSettings
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Settings
settings
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
startTime
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe SubtitlesOutput
subtitles
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe (NonEmpty Tag)
tags
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Transcript
transcript
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
transcriptionJobName
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe TranscriptionJobStatus
transcriptionJobStatus
instance Prelude.NFData TranscriptionJob where
rnf :: TranscriptionJob -> ()
rnf TranscriptionJob' {Maybe Bool
Maybe Double
Maybe Natural
Maybe [LanguageCodeItem]
Maybe (NonEmpty LanguageCode)
Maybe (NonEmpty Tag)
Maybe Text
Maybe (HashMap LanguageCode LanguageIdSettings)
Maybe POSIX
Maybe JobExecutionSettings
Maybe LanguageCode
Maybe Media
Maybe MediaFormat
Maybe ModelSettings
Maybe ContentRedaction
Maybe SubtitlesOutput
Maybe Transcript
Maybe TranscriptionJobStatus
Maybe Settings
transcriptionJobStatus :: Maybe TranscriptionJobStatus
transcriptionJobName :: Maybe Text
transcript :: Maybe Transcript
tags :: Maybe (NonEmpty Tag)
subtitles :: Maybe SubtitlesOutput
startTime :: Maybe POSIX
settings :: Maybe Settings
modelSettings :: Maybe ModelSettings
mediaSampleRateHertz :: Maybe Natural
mediaFormat :: Maybe MediaFormat
media :: Maybe Media
languageOptions :: Maybe (NonEmpty LanguageCode)
languageIdSettings :: Maybe (HashMap LanguageCode LanguageIdSettings)
languageCodes :: Maybe [LanguageCodeItem]
languageCode :: Maybe LanguageCode
jobExecutionSettings :: Maybe JobExecutionSettings
identifyMultipleLanguages :: Maybe Bool
identifyLanguage :: Maybe Bool
identifiedLanguageScore :: Maybe Double
failureReason :: Maybe Text
creationTime :: Maybe POSIX
contentRedaction :: Maybe ContentRedaction
completionTime :: Maybe POSIX
$sel:transcriptionJobStatus:TranscriptionJob' :: TranscriptionJob -> Maybe TranscriptionJobStatus
$sel:transcriptionJobName:TranscriptionJob' :: TranscriptionJob -> Maybe Text
$sel:transcript:TranscriptionJob' :: TranscriptionJob -> Maybe Transcript
$sel:tags:TranscriptionJob' :: TranscriptionJob -> Maybe (NonEmpty Tag)
$sel:subtitles:TranscriptionJob' :: TranscriptionJob -> Maybe SubtitlesOutput
$sel:startTime:TranscriptionJob' :: TranscriptionJob -> Maybe POSIX
$sel:settings:TranscriptionJob' :: TranscriptionJob -> Maybe Settings
$sel:modelSettings:TranscriptionJob' :: TranscriptionJob -> Maybe ModelSettings
$sel:mediaSampleRateHertz:TranscriptionJob' :: TranscriptionJob -> Maybe Natural
$sel:mediaFormat:TranscriptionJob' :: TranscriptionJob -> Maybe MediaFormat
$sel:media:TranscriptionJob' :: TranscriptionJob -> Maybe Media
$sel:languageOptions:TranscriptionJob' :: TranscriptionJob -> Maybe (NonEmpty LanguageCode)
$sel:languageIdSettings:TranscriptionJob' :: TranscriptionJob -> Maybe (HashMap LanguageCode LanguageIdSettings)
$sel:languageCodes:TranscriptionJob' :: TranscriptionJob -> Maybe [LanguageCodeItem]
$sel:languageCode:TranscriptionJob' :: TranscriptionJob -> Maybe LanguageCode
$sel:jobExecutionSettings:TranscriptionJob' :: TranscriptionJob -> Maybe JobExecutionSettings
$sel:identifyMultipleLanguages:TranscriptionJob' :: TranscriptionJob -> Maybe Bool
$sel:identifyLanguage:TranscriptionJob' :: TranscriptionJob -> Maybe Bool
$sel:identifiedLanguageScore:TranscriptionJob' :: TranscriptionJob -> Maybe Double
$sel:failureReason:TranscriptionJob' :: TranscriptionJob -> Maybe Text
$sel:creationTime:TranscriptionJob' :: TranscriptionJob -> Maybe POSIX
$sel:contentRedaction:TranscriptionJob' :: TranscriptionJob -> Maybe ContentRedaction
$sel:completionTime:TranscriptionJob' :: TranscriptionJob -> Maybe POSIX
..} =
forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
completionTime
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ContentRedaction
contentRedaction
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
creationTime
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
failureReason
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Double
identifiedLanguageScore
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
identifyLanguage
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
identifyMultipleLanguages
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe JobExecutionSettings
jobExecutionSettings
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe LanguageCode
languageCode
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [LanguageCodeItem]
languageCodes
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe (HashMap LanguageCode LanguageIdSettings)
languageIdSettings
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe (NonEmpty LanguageCode)
languageOptions
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Media
media
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe MediaFormat
mediaFormat
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
mediaSampleRateHertz
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ModelSettings
modelSettings
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Settings
settings
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
startTime
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe SubtitlesOutput
subtitles
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe (NonEmpty Tag)
tags
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Transcript
transcript
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe Text
transcriptionJobName
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
Maybe TranscriptionJobStatus
transcriptionJobStatus