{-# 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.SageMaker.Types.HyperParameterTuningJobSummary where
import qualified Amazonka.Core as Core
import qualified Amazonka.Lens as Lens
import qualified Amazonka.Prelude as Prelude
import Amazonka.SageMaker.Types.HyperParameterTuningJobStatus
import Amazonka.SageMaker.Types.HyperParameterTuningJobStrategyType
import Amazonka.SageMaker.Types.ObjectiveStatusCounters
import Amazonka.SageMaker.Types.ResourceLimits
import Amazonka.SageMaker.Types.TrainingJobStatusCounters
data HyperParameterTuningJobSummary = HyperParameterTuningJobSummary'
{
HyperParameterTuningJobSummary -> Maybe ResourceLimits
resourceLimits :: Prelude.Maybe ResourceLimits,
HyperParameterTuningJobSummary -> Maybe POSIX
lastModifiedTime :: Prelude.Maybe Core.POSIX,
HyperParameterTuningJobSummary -> Maybe POSIX
hyperParameterTuningEndTime :: Prelude.Maybe Core.POSIX,
HyperParameterTuningJobSummary -> Text
hyperParameterTuningJobName :: Prelude.Text,
HyperParameterTuningJobSummary -> Text
hyperParameterTuningJobArn :: Prelude.Text,
HyperParameterTuningJobSummary -> HyperParameterTuningJobStatus
hyperParameterTuningJobStatus :: HyperParameterTuningJobStatus,
HyperParameterTuningJobSummary
-> HyperParameterTuningJobStrategyType
strategy :: HyperParameterTuningJobStrategyType,
HyperParameterTuningJobSummary -> POSIX
creationTime :: Core.POSIX,
HyperParameterTuningJobSummary -> TrainingJobStatusCounters
trainingJobStatusCounters :: TrainingJobStatusCounters,
HyperParameterTuningJobSummary -> ObjectiveStatusCounters
objectiveStatusCounters :: ObjectiveStatusCounters
}
deriving (HyperParameterTuningJobSummary
-> HyperParameterTuningJobSummary -> Bool
(HyperParameterTuningJobSummary
-> HyperParameterTuningJobSummary -> Bool)
-> (HyperParameterTuningJobSummary
-> HyperParameterTuningJobSummary -> Bool)
-> Eq HyperParameterTuningJobSummary
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: HyperParameterTuningJobSummary
-> HyperParameterTuningJobSummary -> Bool
$c/= :: HyperParameterTuningJobSummary
-> HyperParameterTuningJobSummary -> Bool
== :: HyperParameterTuningJobSummary
-> HyperParameterTuningJobSummary -> Bool
$c== :: HyperParameterTuningJobSummary
-> HyperParameterTuningJobSummary -> Bool
Prelude.Eq, ReadPrec [HyperParameterTuningJobSummary]
ReadPrec HyperParameterTuningJobSummary
Int -> ReadS HyperParameterTuningJobSummary
ReadS [HyperParameterTuningJobSummary]
(Int -> ReadS HyperParameterTuningJobSummary)
-> ReadS [HyperParameterTuningJobSummary]
-> ReadPrec HyperParameterTuningJobSummary
-> ReadPrec [HyperParameterTuningJobSummary]
-> Read HyperParameterTuningJobSummary
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [HyperParameterTuningJobSummary]
$creadListPrec :: ReadPrec [HyperParameterTuningJobSummary]
readPrec :: ReadPrec HyperParameterTuningJobSummary
$creadPrec :: ReadPrec HyperParameterTuningJobSummary
readList :: ReadS [HyperParameterTuningJobSummary]
$creadList :: ReadS [HyperParameterTuningJobSummary]
readsPrec :: Int -> ReadS HyperParameterTuningJobSummary
$creadsPrec :: Int -> ReadS HyperParameterTuningJobSummary
Prelude.Read, Int -> HyperParameterTuningJobSummary -> ShowS
[HyperParameterTuningJobSummary] -> ShowS
HyperParameterTuningJobSummary -> String
(Int -> HyperParameterTuningJobSummary -> ShowS)
-> (HyperParameterTuningJobSummary -> String)
-> ([HyperParameterTuningJobSummary] -> ShowS)
-> Show HyperParameterTuningJobSummary
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [HyperParameterTuningJobSummary] -> ShowS
$cshowList :: [HyperParameterTuningJobSummary] -> ShowS
show :: HyperParameterTuningJobSummary -> String
$cshow :: HyperParameterTuningJobSummary -> String
showsPrec :: Int -> HyperParameterTuningJobSummary -> ShowS
$cshowsPrec :: Int -> HyperParameterTuningJobSummary -> ShowS
Prelude.Show, (forall x.
HyperParameterTuningJobSummary
-> Rep HyperParameterTuningJobSummary x)
-> (forall x.
Rep HyperParameterTuningJobSummary x
-> HyperParameterTuningJobSummary)
-> Generic HyperParameterTuningJobSummary
forall x.
Rep HyperParameterTuningJobSummary x
-> HyperParameterTuningJobSummary
forall x.
HyperParameterTuningJobSummary
-> Rep HyperParameterTuningJobSummary x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep HyperParameterTuningJobSummary x
-> HyperParameterTuningJobSummary
$cfrom :: forall x.
HyperParameterTuningJobSummary
-> Rep HyperParameterTuningJobSummary x
Prelude.Generic)
newHyperParameterTuningJobSummary ::
Prelude.Text ->
Prelude.Text ->
HyperParameterTuningJobStatus ->
HyperParameterTuningJobStrategyType ->
Prelude.UTCTime ->
TrainingJobStatusCounters ->
ObjectiveStatusCounters ->
HyperParameterTuningJobSummary
newHyperParameterTuningJobSummary :: Text
-> Text
-> HyperParameterTuningJobStatus
-> HyperParameterTuningJobStrategyType
-> UTCTime
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary
newHyperParameterTuningJobSummary
Text
pHyperParameterTuningJobName_
Text
pHyperParameterTuningJobArn_
HyperParameterTuningJobStatus
pHyperParameterTuningJobStatus_
HyperParameterTuningJobStrategyType
pStrategy_
UTCTime
pCreationTime_
TrainingJobStatusCounters
pTrainingJobStatusCounters_
ObjectiveStatusCounters
pObjectiveStatusCounters_ =
HyperParameterTuningJobSummary' :: Maybe ResourceLimits
-> Maybe POSIX
-> Maybe POSIX
-> Text
-> Text
-> HyperParameterTuningJobStatus
-> HyperParameterTuningJobStrategyType
-> POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary
HyperParameterTuningJobSummary'
{ $sel:resourceLimits:HyperParameterTuningJobSummary' :: Maybe ResourceLimits
resourceLimits =
Maybe ResourceLimits
forall a. Maybe a
Prelude.Nothing,
$sel:lastModifiedTime:HyperParameterTuningJobSummary' :: Maybe POSIX
lastModifiedTime = Maybe POSIX
forall a. Maybe a
Prelude.Nothing,
$sel:hyperParameterTuningEndTime:HyperParameterTuningJobSummary' :: Maybe POSIX
hyperParameterTuningEndTime =
Maybe POSIX
forall a. Maybe a
Prelude.Nothing,
$sel:hyperParameterTuningJobName:HyperParameterTuningJobSummary' :: Text
hyperParameterTuningJobName =
Text
pHyperParameterTuningJobName_,
$sel:hyperParameterTuningJobArn:HyperParameterTuningJobSummary' :: Text
hyperParameterTuningJobArn =
Text
pHyperParameterTuningJobArn_,
$sel:hyperParameterTuningJobStatus:HyperParameterTuningJobSummary' :: HyperParameterTuningJobStatus
hyperParameterTuningJobStatus =
HyperParameterTuningJobStatus
pHyperParameterTuningJobStatus_,
$sel:strategy:HyperParameterTuningJobSummary' :: HyperParameterTuningJobStrategyType
strategy = HyperParameterTuningJobStrategyType
pStrategy_,
$sel:creationTime:HyperParameterTuningJobSummary' :: POSIX
creationTime =
Tagged UTCTime (Identity UTCTime) -> Tagged POSIX (Identity POSIX)
forall (a :: Format). Iso' (Time a) UTCTime
Core._Time (Tagged UTCTime (Identity UTCTime)
-> Tagged POSIX (Identity POSIX))
-> UTCTime -> POSIX
forall t b. AReview t b -> b -> t
Lens.# UTCTime
pCreationTime_,
$sel:trainingJobStatusCounters:HyperParameterTuningJobSummary' :: TrainingJobStatusCounters
trainingJobStatusCounters =
TrainingJobStatusCounters
pTrainingJobStatusCounters_,
$sel:objectiveStatusCounters:HyperParameterTuningJobSummary' :: ObjectiveStatusCounters
objectiveStatusCounters =
ObjectiveStatusCounters
pObjectiveStatusCounters_
}
hyperParameterTuningJobSummary_resourceLimits :: Lens.Lens' HyperParameterTuningJobSummary (Prelude.Maybe ResourceLimits)
hyperParameterTuningJobSummary_resourceLimits :: (Maybe ResourceLimits -> f (Maybe ResourceLimits))
-> HyperParameterTuningJobSummary
-> f HyperParameterTuningJobSummary
hyperParameterTuningJobSummary_resourceLimits = (HyperParameterTuningJobSummary -> Maybe ResourceLimits)
-> (HyperParameterTuningJobSummary
-> Maybe ResourceLimits -> HyperParameterTuningJobSummary)
-> Lens
HyperParameterTuningJobSummary
HyperParameterTuningJobSummary
(Maybe ResourceLimits)
(Maybe ResourceLimits)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HyperParameterTuningJobSummary' {Maybe ResourceLimits
resourceLimits :: Maybe ResourceLimits
$sel:resourceLimits:HyperParameterTuningJobSummary' :: HyperParameterTuningJobSummary -> Maybe ResourceLimits
resourceLimits} -> Maybe ResourceLimits
resourceLimits) (\s :: HyperParameterTuningJobSummary
s@HyperParameterTuningJobSummary' {} Maybe ResourceLimits
a -> HyperParameterTuningJobSummary
s {$sel:resourceLimits:HyperParameterTuningJobSummary' :: Maybe ResourceLimits
resourceLimits = Maybe ResourceLimits
a} :: HyperParameterTuningJobSummary)
hyperParameterTuningJobSummary_lastModifiedTime :: Lens.Lens' HyperParameterTuningJobSummary (Prelude.Maybe Prelude.UTCTime)
hyperParameterTuningJobSummary_lastModifiedTime :: (Maybe UTCTime -> f (Maybe UTCTime))
-> HyperParameterTuningJobSummary
-> f HyperParameterTuningJobSummary
hyperParameterTuningJobSummary_lastModifiedTime = (HyperParameterTuningJobSummary -> Maybe POSIX)
-> (HyperParameterTuningJobSummary
-> Maybe POSIX -> HyperParameterTuningJobSummary)
-> Lens
HyperParameterTuningJobSummary
HyperParameterTuningJobSummary
(Maybe POSIX)
(Maybe POSIX)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HyperParameterTuningJobSummary' {Maybe POSIX
lastModifiedTime :: Maybe POSIX
$sel:lastModifiedTime:HyperParameterTuningJobSummary' :: HyperParameterTuningJobSummary -> Maybe POSIX
lastModifiedTime} -> Maybe POSIX
lastModifiedTime) (\s :: HyperParameterTuningJobSummary
s@HyperParameterTuningJobSummary' {} Maybe POSIX
a -> HyperParameterTuningJobSummary
s {$sel:lastModifiedTime:HyperParameterTuningJobSummary' :: Maybe POSIX
lastModifiedTime = Maybe POSIX
a} :: HyperParameterTuningJobSummary) ((Maybe POSIX -> f (Maybe POSIX))
-> HyperParameterTuningJobSummary
-> f HyperParameterTuningJobSummary)
-> ((Maybe UTCTime -> f (Maybe UTCTime))
-> Maybe POSIX -> f (Maybe POSIX))
-> (Maybe UTCTime -> f (Maybe UTCTime))
-> HyperParameterTuningJobSummary
-> f HyperParameterTuningJobSummary
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. AnIso POSIX POSIX UTCTime UTCTime
-> Iso (Maybe POSIX) (Maybe POSIX) (Maybe UTCTime) (Maybe UTCTime)
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 AnIso POSIX POSIX UTCTime UTCTime
forall (a :: Format). Iso' (Time a) UTCTime
Core._Time
hyperParameterTuningJobSummary_hyperParameterTuningEndTime :: Lens.Lens' HyperParameterTuningJobSummary (Prelude.Maybe Prelude.UTCTime)
hyperParameterTuningJobSummary_hyperParameterTuningEndTime :: (Maybe UTCTime -> f (Maybe UTCTime))
-> HyperParameterTuningJobSummary
-> f HyperParameterTuningJobSummary
hyperParameterTuningJobSummary_hyperParameterTuningEndTime = (HyperParameterTuningJobSummary -> Maybe POSIX)
-> (HyperParameterTuningJobSummary
-> Maybe POSIX -> HyperParameterTuningJobSummary)
-> Lens
HyperParameterTuningJobSummary
HyperParameterTuningJobSummary
(Maybe POSIX)
(Maybe POSIX)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HyperParameterTuningJobSummary' {Maybe POSIX
hyperParameterTuningEndTime :: Maybe POSIX
$sel:hyperParameterTuningEndTime:HyperParameterTuningJobSummary' :: HyperParameterTuningJobSummary -> Maybe POSIX
hyperParameterTuningEndTime} -> Maybe POSIX
hyperParameterTuningEndTime) (\s :: HyperParameterTuningJobSummary
s@HyperParameterTuningJobSummary' {} Maybe POSIX
a -> HyperParameterTuningJobSummary
s {$sel:hyperParameterTuningEndTime:HyperParameterTuningJobSummary' :: Maybe POSIX
hyperParameterTuningEndTime = Maybe POSIX
a} :: HyperParameterTuningJobSummary) ((Maybe POSIX -> f (Maybe POSIX))
-> HyperParameterTuningJobSummary
-> f HyperParameterTuningJobSummary)
-> ((Maybe UTCTime -> f (Maybe UTCTime))
-> Maybe POSIX -> f (Maybe POSIX))
-> (Maybe UTCTime -> f (Maybe UTCTime))
-> HyperParameterTuningJobSummary
-> f HyperParameterTuningJobSummary
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. AnIso POSIX POSIX UTCTime UTCTime
-> Iso (Maybe POSIX) (Maybe POSIX) (Maybe UTCTime) (Maybe UTCTime)
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 AnIso POSIX POSIX UTCTime UTCTime
forall (a :: Format). Iso' (Time a) UTCTime
Core._Time
hyperParameterTuningJobSummary_hyperParameterTuningJobName :: Lens.Lens' HyperParameterTuningJobSummary Prelude.Text
hyperParameterTuningJobSummary_hyperParameterTuningJobName :: (Text -> f Text)
-> HyperParameterTuningJobSummary
-> f HyperParameterTuningJobSummary
hyperParameterTuningJobSummary_hyperParameterTuningJobName = (HyperParameterTuningJobSummary -> Text)
-> (HyperParameterTuningJobSummary
-> Text -> HyperParameterTuningJobSummary)
-> Lens
HyperParameterTuningJobSummary
HyperParameterTuningJobSummary
Text
Text
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HyperParameterTuningJobSummary' {Text
hyperParameterTuningJobName :: Text
$sel:hyperParameterTuningJobName:HyperParameterTuningJobSummary' :: HyperParameterTuningJobSummary -> Text
hyperParameterTuningJobName} -> Text
hyperParameterTuningJobName) (\s :: HyperParameterTuningJobSummary
s@HyperParameterTuningJobSummary' {} Text
a -> HyperParameterTuningJobSummary
s {$sel:hyperParameterTuningJobName:HyperParameterTuningJobSummary' :: Text
hyperParameterTuningJobName = Text
a} :: HyperParameterTuningJobSummary)
hyperParameterTuningJobSummary_hyperParameterTuningJobArn :: Lens.Lens' HyperParameterTuningJobSummary Prelude.Text
hyperParameterTuningJobSummary_hyperParameterTuningJobArn :: (Text -> f Text)
-> HyperParameterTuningJobSummary
-> f HyperParameterTuningJobSummary
hyperParameterTuningJobSummary_hyperParameterTuningJobArn = (HyperParameterTuningJobSummary -> Text)
-> (HyperParameterTuningJobSummary
-> Text -> HyperParameterTuningJobSummary)
-> Lens
HyperParameterTuningJobSummary
HyperParameterTuningJobSummary
Text
Text
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HyperParameterTuningJobSummary' {Text
hyperParameterTuningJobArn :: Text
$sel:hyperParameterTuningJobArn:HyperParameterTuningJobSummary' :: HyperParameterTuningJobSummary -> Text
hyperParameterTuningJobArn} -> Text
hyperParameterTuningJobArn) (\s :: HyperParameterTuningJobSummary
s@HyperParameterTuningJobSummary' {} Text
a -> HyperParameterTuningJobSummary
s {$sel:hyperParameterTuningJobArn:HyperParameterTuningJobSummary' :: Text
hyperParameterTuningJobArn = Text
a} :: HyperParameterTuningJobSummary)
hyperParameterTuningJobSummary_hyperParameterTuningJobStatus :: Lens.Lens' HyperParameterTuningJobSummary HyperParameterTuningJobStatus
hyperParameterTuningJobSummary_hyperParameterTuningJobStatus :: (HyperParameterTuningJobStatus -> f HyperParameterTuningJobStatus)
-> HyperParameterTuningJobSummary
-> f HyperParameterTuningJobSummary
hyperParameterTuningJobSummary_hyperParameterTuningJobStatus = (HyperParameterTuningJobSummary -> HyperParameterTuningJobStatus)
-> (HyperParameterTuningJobSummary
-> HyperParameterTuningJobStatus -> HyperParameterTuningJobSummary)
-> Lens
HyperParameterTuningJobSummary
HyperParameterTuningJobSummary
HyperParameterTuningJobStatus
HyperParameterTuningJobStatus
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HyperParameterTuningJobSummary' {HyperParameterTuningJobStatus
hyperParameterTuningJobStatus :: HyperParameterTuningJobStatus
$sel:hyperParameterTuningJobStatus:HyperParameterTuningJobSummary' :: HyperParameterTuningJobSummary -> HyperParameterTuningJobStatus
hyperParameterTuningJobStatus} -> HyperParameterTuningJobStatus
hyperParameterTuningJobStatus) (\s :: HyperParameterTuningJobSummary
s@HyperParameterTuningJobSummary' {} HyperParameterTuningJobStatus
a -> HyperParameterTuningJobSummary
s {$sel:hyperParameterTuningJobStatus:HyperParameterTuningJobSummary' :: HyperParameterTuningJobStatus
hyperParameterTuningJobStatus = HyperParameterTuningJobStatus
a} :: HyperParameterTuningJobSummary)
hyperParameterTuningJobSummary_strategy :: Lens.Lens' HyperParameterTuningJobSummary HyperParameterTuningJobStrategyType
hyperParameterTuningJobSummary_strategy :: (HyperParameterTuningJobStrategyType
-> f HyperParameterTuningJobStrategyType)
-> HyperParameterTuningJobSummary
-> f HyperParameterTuningJobSummary
hyperParameterTuningJobSummary_strategy = (HyperParameterTuningJobSummary
-> HyperParameterTuningJobStrategyType)
-> (HyperParameterTuningJobSummary
-> HyperParameterTuningJobStrategyType
-> HyperParameterTuningJobSummary)
-> Lens
HyperParameterTuningJobSummary
HyperParameterTuningJobSummary
HyperParameterTuningJobStrategyType
HyperParameterTuningJobStrategyType
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HyperParameterTuningJobSummary' {HyperParameterTuningJobStrategyType
strategy :: HyperParameterTuningJobStrategyType
$sel:strategy:HyperParameterTuningJobSummary' :: HyperParameterTuningJobSummary
-> HyperParameterTuningJobStrategyType
strategy} -> HyperParameterTuningJobStrategyType
strategy) (\s :: HyperParameterTuningJobSummary
s@HyperParameterTuningJobSummary' {} HyperParameterTuningJobStrategyType
a -> HyperParameterTuningJobSummary
s {$sel:strategy:HyperParameterTuningJobSummary' :: HyperParameterTuningJobStrategyType
strategy = HyperParameterTuningJobStrategyType
a} :: HyperParameterTuningJobSummary)
hyperParameterTuningJobSummary_creationTime :: Lens.Lens' HyperParameterTuningJobSummary Prelude.UTCTime
hyperParameterTuningJobSummary_creationTime :: (UTCTime -> f UTCTime)
-> HyperParameterTuningJobSummary
-> f HyperParameterTuningJobSummary
hyperParameterTuningJobSummary_creationTime = (HyperParameterTuningJobSummary -> POSIX)
-> (HyperParameterTuningJobSummary
-> POSIX -> HyperParameterTuningJobSummary)
-> Lens
HyperParameterTuningJobSummary
HyperParameterTuningJobSummary
POSIX
POSIX
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HyperParameterTuningJobSummary' {POSIX
creationTime :: POSIX
$sel:creationTime:HyperParameterTuningJobSummary' :: HyperParameterTuningJobSummary -> POSIX
creationTime} -> POSIX
creationTime) (\s :: HyperParameterTuningJobSummary
s@HyperParameterTuningJobSummary' {} POSIX
a -> HyperParameterTuningJobSummary
s {$sel:creationTime:HyperParameterTuningJobSummary' :: POSIX
creationTime = POSIX
a} :: HyperParameterTuningJobSummary) ((POSIX -> f POSIX)
-> HyperParameterTuningJobSummary
-> f HyperParameterTuningJobSummary)
-> ((UTCTime -> f UTCTime) -> POSIX -> f POSIX)
-> (UTCTime -> f UTCTime)
-> HyperParameterTuningJobSummary
-> f HyperParameterTuningJobSummary
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. (UTCTime -> f UTCTime) -> POSIX -> f POSIX
forall (a :: Format). Iso' (Time a) UTCTime
Core._Time
hyperParameterTuningJobSummary_trainingJobStatusCounters :: Lens.Lens' HyperParameterTuningJobSummary TrainingJobStatusCounters
hyperParameterTuningJobSummary_trainingJobStatusCounters :: (TrainingJobStatusCounters -> f TrainingJobStatusCounters)
-> HyperParameterTuningJobSummary
-> f HyperParameterTuningJobSummary
hyperParameterTuningJobSummary_trainingJobStatusCounters = (HyperParameterTuningJobSummary -> TrainingJobStatusCounters)
-> (HyperParameterTuningJobSummary
-> TrainingJobStatusCounters -> HyperParameterTuningJobSummary)
-> Lens
HyperParameterTuningJobSummary
HyperParameterTuningJobSummary
TrainingJobStatusCounters
TrainingJobStatusCounters
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HyperParameterTuningJobSummary' {TrainingJobStatusCounters
trainingJobStatusCounters :: TrainingJobStatusCounters
$sel:trainingJobStatusCounters:HyperParameterTuningJobSummary' :: HyperParameterTuningJobSummary -> TrainingJobStatusCounters
trainingJobStatusCounters} -> TrainingJobStatusCounters
trainingJobStatusCounters) (\s :: HyperParameterTuningJobSummary
s@HyperParameterTuningJobSummary' {} TrainingJobStatusCounters
a -> HyperParameterTuningJobSummary
s {$sel:trainingJobStatusCounters:HyperParameterTuningJobSummary' :: TrainingJobStatusCounters
trainingJobStatusCounters = TrainingJobStatusCounters
a} :: HyperParameterTuningJobSummary)
hyperParameterTuningJobSummary_objectiveStatusCounters :: Lens.Lens' HyperParameterTuningJobSummary ObjectiveStatusCounters
hyperParameterTuningJobSummary_objectiveStatusCounters :: (ObjectiveStatusCounters -> f ObjectiveStatusCounters)
-> HyperParameterTuningJobSummary
-> f HyperParameterTuningJobSummary
hyperParameterTuningJobSummary_objectiveStatusCounters = (HyperParameterTuningJobSummary -> ObjectiveStatusCounters)
-> (HyperParameterTuningJobSummary
-> ObjectiveStatusCounters -> HyperParameterTuningJobSummary)
-> Lens
HyperParameterTuningJobSummary
HyperParameterTuningJobSummary
ObjectiveStatusCounters
ObjectiveStatusCounters
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HyperParameterTuningJobSummary' {ObjectiveStatusCounters
objectiveStatusCounters :: ObjectiveStatusCounters
$sel:objectiveStatusCounters:HyperParameterTuningJobSummary' :: HyperParameterTuningJobSummary -> ObjectiveStatusCounters
objectiveStatusCounters} -> ObjectiveStatusCounters
objectiveStatusCounters) (\s :: HyperParameterTuningJobSummary
s@HyperParameterTuningJobSummary' {} ObjectiveStatusCounters
a -> HyperParameterTuningJobSummary
s {$sel:objectiveStatusCounters:HyperParameterTuningJobSummary' :: ObjectiveStatusCounters
objectiveStatusCounters = ObjectiveStatusCounters
a} :: HyperParameterTuningJobSummary)
instance Core.FromJSON HyperParameterTuningJobSummary where
parseJSON :: Value -> Parser HyperParameterTuningJobSummary
parseJSON =
String
-> (Object -> Parser HyperParameterTuningJobSummary)
-> Value
-> Parser HyperParameterTuningJobSummary
forall a. String -> (Object -> Parser a) -> Value -> Parser a
Core.withObject
String
"HyperParameterTuningJobSummary"
( \Object
x ->
Maybe ResourceLimits
-> Maybe POSIX
-> Maybe POSIX
-> Text
-> Text
-> HyperParameterTuningJobStatus
-> HyperParameterTuningJobStrategyType
-> POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary
HyperParameterTuningJobSummary'
(Maybe ResourceLimits
-> Maybe POSIX
-> Maybe POSIX
-> Text
-> Text
-> HyperParameterTuningJobStatus
-> HyperParameterTuningJobStrategyType
-> POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary)
-> Parser (Maybe ResourceLimits)
-> Parser
(Maybe POSIX
-> Maybe POSIX
-> Text
-> Text
-> HyperParameterTuningJobStatus
-> HyperParameterTuningJobStrategyType
-> POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x Object -> Text -> Parser (Maybe ResourceLimits)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"ResourceLimits")
Parser
(Maybe POSIX
-> Maybe POSIX
-> Text
-> Text
-> HyperParameterTuningJobStatus
-> HyperParameterTuningJobStrategyType
-> POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary)
-> Parser (Maybe POSIX)
-> Parser
(Maybe POSIX
-> Text
-> Text
-> HyperParameterTuningJobStatus
-> HyperParameterTuningJobStrategyType
-> POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe POSIX)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"LastModifiedTime")
Parser
(Maybe POSIX
-> Text
-> Text
-> HyperParameterTuningJobStatus
-> HyperParameterTuningJobStrategyType
-> POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary)
-> Parser (Maybe POSIX)
-> Parser
(Text
-> Text
-> HyperParameterTuningJobStatus
-> HyperParameterTuningJobStrategyType
-> POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe POSIX)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"HyperParameterTuningEndTime")
Parser
(Text
-> Text
-> HyperParameterTuningJobStatus
-> HyperParameterTuningJobStrategyType
-> POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary)
-> Parser Text
-> Parser
(Text
-> HyperParameterTuningJobStatus
-> HyperParameterTuningJobStrategyType
-> POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser Text
forall a. FromJSON a => Object -> Text -> Parser a
Core..: Text
"HyperParameterTuningJobName")
Parser
(Text
-> HyperParameterTuningJobStatus
-> HyperParameterTuningJobStrategyType
-> POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary)
-> Parser Text
-> Parser
(HyperParameterTuningJobStatus
-> HyperParameterTuningJobStrategyType
-> POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser Text
forall a. FromJSON a => Object -> Text -> Parser a
Core..: Text
"HyperParameterTuningJobArn")
Parser
(HyperParameterTuningJobStatus
-> HyperParameterTuningJobStrategyType
-> POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary)
-> Parser HyperParameterTuningJobStatus
-> Parser
(HyperParameterTuningJobStrategyType
-> POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser HyperParameterTuningJobStatus
forall a. FromJSON a => Object -> Text -> Parser a
Core..: Text
"HyperParameterTuningJobStatus")
Parser
(HyperParameterTuningJobStrategyType
-> POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary)
-> Parser HyperParameterTuningJobStrategyType
-> Parser
(POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser HyperParameterTuningJobStrategyType
forall a. FromJSON a => Object -> Text -> Parser a
Core..: Text
"Strategy")
Parser
(POSIX
-> TrainingJobStatusCounters
-> ObjectiveStatusCounters
-> HyperParameterTuningJobSummary)
-> Parser POSIX
-> Parser
(TrainingJobStatusCounters
-> ObjectiveStatusCounters -> HyperParameterTuningJobSummary)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser POSIX
forall a. FromJSON a => Object -> Text -> Parser a
Core..: Text
"CreationTime")
Parser
(TrainingJobStatusCounters
-> ObjectiveStatusCounters -> HyperParameterTuningJobSummary)
-> Parser TrainingJobStatusCounters
-> Parser
(ObjectiveStatusCounters -> HyperParameterTuningJobSummary)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser TrainingJobStatusCounters
forall a. FromJSON a => Object -> Text -> Parser a
Core..: Text
"TrainingJobStatusCounters")
Parser (ObjectiveStatusCounters -> HyperParameterTuningJobSummary)
-> Parser ObjectiveStatusCounters
-> Parser HyperParameterTuningJobSummary
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser ObjectiveStatusCounters
forall a. FromJSON a => Object -> Text -> Parser a
Core..: Text
"ObjectiveStatusCounters")
)
instance
Prelude.Hashable
HyperParameterTuningJobSummary
instance
Prelude.NFData
HyperParameterTuningJobSummary