{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-binds #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}

-- Derived from AWS service descriptions, licensed under Apache 2.0.

-- |
-- Module      : Amazonka.Forecast.DescribePredictor
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- This operation is only valid for legacy predictors created with
-- CreatePredictor. If you are not using a legacy predictor, use
-- DescribeAutoPredictor.
--
-- Describes a predictor created using the CreatePredictor operation.
--
-- In addition to listing the properties provided in the @CreatePredictor@
-- request, this operation lists the following properties:
--
-- -   @DatasetImportJobArns@ - The dataset import jobs used to import
--     training data.
--
-- -   @AutoMLAlgorithmArns@ - If AutoML is performed, the algorithms that
--     were evaluated.
--
-- -   @CreationTime@
--
-- -   @LastModificationTime@
--
-- -   @Status@
--
-- -   @Message@ - If an error occurred, information about the error.
module Amazonka.Forecast.DescribePredictor
  ( -- * Creating a Request
    DescribePredictor (..),
    newDescribePredictor,

    -- * Request Lenses
    describePredictor_predictorArn,

    -- * Destructuring the Response
    DescribePredictorResponse (..),
    newDescribePredictorResponse,

    -- * Response Lenses
    describePredictorResponse_algorithmArn,
    describePredictorResponse_autoMLAlgorithmArns,
    describePredictorResponse_autoMLOverrideStrategy,
    describePredictorResponse_creationTime,
    describePredictorResponse_datasetImportJobArns,
    describePredictorResponse_encryptionConfig,
    describePredictorResponse_estimatedTimeRemainingInMinutes,
    describePredictorResponse_evaluationParameters,
    describePredictorResponse_featurizationConfig,
    describePredictorResponse_forecastHorizon,
    describePredictorResponse_forecastTypes,
    describePredictorResponse_hPOConfig,
    describePredictorResponse_inputDataConfig,
    describePredictorResponse_isAutoPredictor,
    describePredictorResponse_lastModificationTime,
    describePredictorResponse_message,
    describePredictorResponse_optimizationMetric,
    describePredictorResponse_performAutoML,
    describePredictorResponse_performHPO,
    describePredictorResponse_predictorArn,
    describePredictorResponse_predictorExecutionDetails,
    describePredictorResponse_predictorName,
    describePredictorResponse_status,
    describePredictorResponse_trainingParameters,
    describePredictorResponse_httpStatus,
  )
where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.Forecast.Types
import qualified Amazonka.Prelude as Prelude
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response

-- | /See:/ 'newDescribePredictor' smart constructor.
data DescribePredictor = DescribePredictor'
  { -- | The Amazon Resource Name (ARN) of the predictor that you want
    -- information about.
    DescribePredictor -> Text
predictorArn :: Prelude.Text
  }
  deriving (DescribePredictor -> DescribePredictor -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribePredictor -> DescribePredictor -> Bool
$c/= :: DescribePredictor -> DescribePredictor -> Bool
== :: DescribePredictor -> DescribePredictor -> Bool
$c== :: DescribePredictor -> DescribePredictor -> Bool
Prelude.Eq, ReadPrec [DescribePredictor]
ReadPrec DescribePredictor
Int -> ReadS DescribePredictor
ReadS [DescribePredictor]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribePredictor]
$creadListPrec :: ReadPrec [DescribePredictor]
readPrec :: ReadPrec DescribePredictor
$creadPrec :: ReadPrec DescribePredictor
readList :: ReadS [DescribePredictor]
$creadList :: ReadS [DescribePredictor]
readsPrec :: Int -> ReadS DescribePredictor
$creadsPrec :: Int -> ReadS DescribePredictor
Prelude.Read, Int -> DescribePredictor -> ShowS
[DescribePredictor] -> ShowS
DescribePredictor -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribePredictor] -> ShowS
$cshowList :: [DescribePredictor] -> ShowS
show :: DescribePredictor -> String
$cshow :: DescribePredictor -> String
showsPrec :: Int -> DescribePredictor -> ShowS
$cshowsPrec :: Int -> DescribePredictor -> ShowS
Prelude.Show, forall x. Rep DescribePredictor x -> DescribePredictor
forall x. DescribePredictor -> Rep DescribePredictor x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DescribePredictor x -> DescribePredictor
$cfrom :: forall x. DescribePredictor -> Rep DescribePredictor x
Prelude.Generic)

-- |
-- Create a value of 'DescribePredictor' 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:
--
-- 'predictorArn', 'describePredictor_predictorArn' - The Amazon Resource Name (ARN) of the predictor that you want
-- information about.
newDescribePredictor ::
  -- | 'predictorArn'
  Prelude.Text ->
  DescribePredictor
newDescribePredictor :: Text -> DescribePredictor
newDescribePredictor Text
pPredictorArn_ =
  DescribePredictor' {$sel:predictorArn:DescribePredictor' :: Text
predictorArn = Text
pPredictorArn_}

-- | The Amazon Resource Name (ARN) of the predictor that you want
-- information about.
describePredictor_predictorArn :: Lens.Lens' DescribePredictor Prelude.Text
describePredictor_predictorArn :: Lens' DescribePredictor Text
describePredictor_predictorArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictor' {Text
predictorArn :: Text
$sel:predictorArn:DescribePredictor' :: DescribePredictor -> Text
predictorArn} -> Text
predictorArn) (\s :: DescribePredictor
s@DescribePredictor' {} Text
a -> DescribePredictor
s {$sel:predictorArn:DescribePredictor' :: Text
predictorArn = Text
a} :: DescribePredictor)

instance Core.AWSRequest DescribePredictor where
  type
    AWSResponse DescribePredictor =
      DescribePredictorResponse
  request :: (Service -> Service)
-> DescribePredictor -> Request DescribePredictor
request Service -> Service
overrides =
    forall a. (ToRequest a, ToJSON a) => Service -> a -> Request a
Request.postJSON (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy DescribePredictor
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse DescribePredictor)))
response =
    forall (m :: * -> *) a.
MonadResource m =>
(Int -> ResponseHeaders -> Object -> Either String (AWSResponse a))
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveJSON
      ( \Int
s ResponseHeaders
h Object
x ->
          Maybe Text
-> Maybe [Text]
-> Maybe AutoMLOverrideStrategy
-> Maybe POSIX
-> Maybe [Text]
-> Maybe EncryptionConfig
-> Maybe Integer
-> Maybe EvaluationParameters
-> Maybe FeaturizationConfig
-> Maybe Int
-> Maybe (NonEmpty Text)
-> Maybe HyperParameterTuningJobConfig
-> Maybe InputDataConfig
-> Maybe Bool
-> Maybe POSIX
-> Maybe Text
-> Maybe OptimizationMetric
-> Maybe Bool
-> Maybe Bool
-> Maybe Text
-> Maybe PredictorExecutionDetails
-> Maybe Text
-> Maybe Text
-> Maybe (HashMap Text Text)
-> Int
-> DescribePredictorResponse
DescribePredictorResponse'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"AlgorithmArn")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( Object
x
                            forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"AutoMLAlgorithmArns"
                            forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ 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 -> Either String (Maybe a)
Data..?> Key
"AutoMLOverrideStrategy")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (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 -> Either String (Maybe a)
Data..?> Key
"DatasetImportJobArns"
                            forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ 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 -> Either String (Maybe a)
Data..?> Key
"EncryptionConfig")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"EstimatedTimeRemainingInMinutes")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"EvaluationParameters")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"FeaturizationConfig")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"ForecastHorizon")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"ForecastTypes")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"HPOConfig")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"InputDataConfig")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"IsAutoPredictor")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"LastModificationTime")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"Message")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"OptimizationMetric")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"PerformAutoML")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"PerformHPO")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"PredictorArn")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"PredictorExecutionDetails")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"PredictorName")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"Status")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( Object
x
                            forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"TrainingParameters"
                            forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ forall a. Monoid a => a
Prelude.mempty
                        )
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure (forall a. Enum a => a -> Int
Prelude.fromEnum Int
s))
      )

instance Prelude.Hashable DescribePredictor where
  hashWithSalt :: Int -> DescribePredictor -> Int
hashWithSalt Int
_salt DescribePredictor' {Text
predictorArn :: Text
$sel:predictorArn:DescribePredictor' :: DescribePredictor -> Text
..} =
    Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
predictorArn

instance Prelude.NFData DescribePredictor where
  rnf :: DescribePredictor -> ()
rnf DescribePredictor' {Text
predictorArn :: Text
$sel:predictorArn:DescribePredictor' :: DescribePredictor -> Text
..} = forall a. NFData a => a -> ()
Prelude.rnf Text
predictorArn

instance Data.ToHeaders DescribePredictor where
  toHeaders :: DescribePredictor -> ResponseHeaders
toHeaders =
    forall a b. a -> b -> a
Prelude.const
      ( forall a. Monoid a => [a] -> a
Prelude.mconcat
          [ HeaderName
"X-Amz-Target"
              forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"AmazonForecast.DescribePredictor" ::
                          Prelude.ByteString
                      ),
            HeaderName
"Content-Type"
              forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"application/x-amz-json-1.1" ::
                          Prelude.ByteString
                      )
          ]
      )

instance Data.ToJSON DescribePredictor where
  toJSON :: DescribePredictor -> Value
toJSON DescribePredictor' {Text
predictorArn :: Text
$sel:predictorArn:DescribePredictor' :: DescribePredictor -> Text
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [forall a. a -> Maybe a
Prelude.Just (Key
"PredictorArn" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
predictorArn)]
      )

instance Data.ToPath DescribePredictor where
  toPath :: DescribePredictor -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/"

instance Data.ToQuery DescribePredictor where
  toQuery :: DescribePredictor -> QueryString
toQuery = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty

-- | /See:/ 'newDescribePredictorResponse' smart constructor.
data DescribePredictorResponse = DescribePredictorResponse'
  { -- | The Amazon Resource Name (ARN) of the algorithm used for model training.
    DescribePredictorResponse -> Maybe Text
algorithmArn :: Prelude.Maybe Prelude.Text,
    -- | When @PerformAutoML@ is specified, the ARN of the chosen algorithm.
    DescribePredictorResponse -> Maybe [Text]
autoMLAlgorithmArns :: Prelude.Maybe [Prelude.Text],
    -- | The @LatencyOptimized@ AutoML override strategy is only available in
    -- private beta. Contact AWS Support or your account manager to learn more
    -- about access privileges.
    --
    -- The AutoML strategy used to train the predictor. Unless
    -- @LatencyOptimized@ is specified, the AutoML strategy optimizes predictor
    -- accuracy.
    --
    -- This parameter is only valid for predictors trained using AutoML.
    DescribePredictorResponse -> Maybe AutoMLOverrideStrategy
autoMLOverrideStrategy :: Prelude.Maybe AutoMLOverrideStrategy,
    -- | When the model training task was created.
    DescribePredictorResponse -> Maybe POSIX
creationTime :: Prelude.Maybe Data.POSIX,
    -- | An array of the ARNs of the dataset import jobs used to import training
    -- data for the predictor.
    DescribePredictorResponse -> Maybe [Text]
datasetImportJobArns :: Prelude.Maybe [Prelude.Text],
    -- | An AWS Key Management Service (KMS) key and the AWS Identity and Access
    -- Management (IAM) role that Amazon Forecast can assume to access the key.
    DescribePredictorResponse -> Maybe EncryptionConfig
encryptionConfig :: Prelude.Maybe EncryptionConfig,
    -- | The estimated time remaining in minutes for the predictor training job
    -- to complete.
    DescribePredictorResponse -> Maybe Integer
estimatedTimeRemainingInMinutes :: Prelude.Maybe Prelude.Integer,
    -- | Used to override the default evaluation parameters of the specified
    -- algorithm. Amazon Forecast evaluates a predictor by splitting a dataset
    -- into training data and testing data. The evaluation parameters define
    -- how to perform the split and the number of iterations.
    DescribePredictorResponse -> Maybe EvaluationParameters
evaluationParameters :: Prelude.Maybe EvaluationParameters,
    -- | The featurization configuration.
    DescribePredictorResponse -> Maybe FeaturizationConfig
featurizationConfig :: Prelude.Maybe FeaturizationConfig,
    -- | The number of time-steps of the forecast. The forecast horizon is also
    -- called the prediction length.
    DescribePredictorResponse -> Maybe Int
forecastHorizon :: Prelude.Maybe Prelude.Int,
    -- | The forecast types used during predictor training. Default value is
    -- @[\"0.1\",\"0.5\",\"0.9\"]@
    DescribePredictorResponse -> Maybe (NonEmpty Text)
forecastTypes :: Prelude.Maybe (Prelude.NonEmpty Prelude.Text),
    -- | The hyperparameter override values for the algorithm.
    DescribePredictorResponse -> Maybe HyperParameterTuningJobConfig
hPOConfig :: Prelude.Maybe HyperParameterTuningJobConfig,
    -- | Describes the dataset group that contains the data to use to train the
    -- predictor.
    DescribePredictorResponse -> Maybe InputDataConfig
inputDataConfig :: Prelude.Maybe InputDataConfig,
    -- | Whether the predictor was created with CreateAutoPredictor.
    DescribePredictorResponse -> Maybe Bool
isAutoPredictor :: Prelude.Maybe Prelude.Bool,
    -- | The last time the resource was modified. The timestamp depends on the
    -- status of the job:
    --
    -- -   @CREATE_PENDING@ - The @CreationTime@.
    --
    -- -   @CREATE_IN_PROGRESS@ - The current timestamp.
    --
    -- -   @CREATE_STOPPING@ - The current timestamp.
    --
    -- -   @CREATE_STOPPED@ - When the job stopped.
    --
    -- -   @ACTIVE@ or @CREATE_FAILED@ - When the job finished or failed.
    DescribePredictorResponse -> Maybe POSIX
lastModificationTime :: Prelude.Maybe Data.POSIX,
    -- | If an error occurred, an informational message about the error.
    DescribePredictorResponse -> Maybe Text
message :: Prelude.Maybe Prelude.Text,
    -- | The accuracy metric used to optimize the predictor.
    DescribePredictorResponse -> Maybe OptimizationMetric
optimizationMetric :: Prelude.Maybe OptimizationMetric,
    -- | Whether the predictor is set to perform AutoML.
    DescribePredictorResponse -> Maybe Bool
performAutoML :: Prelude.Maybe Prelude.Bool,
    -- | Whether the predictor is set to perform hyperparameter optimization
    -- (HPO).
    DescribePredictorResponse -> Maybe Bool
performHPO :: Prelude.Maybe Prelude.Bool,
    -- | The ARN of the predictor.
    DescribePredictorResponse -> Maybe Text
predictorArn :: Prelude.Maybe Prelude.Text,
    -- | Details on the the status and results of the backtests performed to
    -- evaluate the accuracy of the predictor. You specify the number of
    -- backtests to perform when you call the operation.
    DescribePredictorResponse -> Maybe PredictorExecutionDetails
predictorExecutionDetails :: Prelude.Maybe PredictorExecutionDetails,
    -- | The name of the predictor.
    DescribePredictorResponse -> Maybe Text
predictorName :: Prelude.Maybe Prelude.Text,
    -- | The status of the predictor. States include:
    --
    -- -   @ACTIVE@
    --
    -- -   @CREATE_PENDING@, @CREATE_IN_PROGRESS@, @CREATE_FAILED@
    --
    -- -   @DELETE_PENDING@, @DELETE_IN_PROGRESS@, @DELETE_FAILED@
    --
    -- -   @CREATE_STOPPING@, @CREATE_STOPPED@
    --
    -- The @Status@ of the predictor must be @ACTIVE@ before you can use the
    -- predictor to create a forecast.
    DescribePredictorResponse -> Maybe Text
status :: Prelude.Maybe Prelude.Text,
    -- | The default training parameters or overrides selected during model
    -- training. When running AutoML or choosing HPO with CNN-QR or DeepAR+,
    -- the optimized values for the chosen hyperparameters are returned. For
    -- more information, see aws-forecast-choosing-recipes.
    DescribePredictorResponse -> Maybe (HashMap Text Text)
trainingParameters :: Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text),
    -- | The response's http status code.
    DescribePredictorResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (DescribePredictorResponse -> DescribePredictorResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribePredictorResponse -> DescribePredictorResponse -> Bool
$c/= :: DescribePredictorResponse -> DescribePredictorResponse -> Bool
== :: DescribePredictorResponse -> DescribePredictorResponse -> Bool
$c== :: DescribePredictorResponse -> DescribePredictorResponse -> Bool
Prelude.Eq, ReadPrec [DescribePredictorResponse]
ReadPrec DescribePredictorResponse
Int -> ReadS DescribePredictorResponse
ReadS [DescribePredictorResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribePredictorResponse]
$creadListPrec :: ReadPrec [DescribePredictorResponse]
readPrec :: ReadPrec DescribePredictorResponse
$creadPrec :: ReadPrec DescribePredictorResponse
readList :: ReadS [DescribePredictorResponse]
$creadList :: ReadS [DescribePredictorResponse]
readsPrec :: Int -> ReadS DescribePredictorResponse
$creadsPrec :: Int -> ReadS DescribePredictorResponse
Prelude.Read, Int -> DescribePredictorResponse -> ShowS
[DescribePredictorResponse] -> ShowS
DescribePredictorResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribePredictorResponse] -> ShowS
$cshowList :: [DescribePredictorResponse] -> ShowS
show :: DescribePredictorResponse -> String
$cshow :: DescribePredictorResponse -> String
showsPrec :: Int -> DescribePredictorResponse -> ShowS
$cshowsPrec :: Int -> DescribePredictorResponse -> ShowS
Prelude.Show, forall x.
Rep DescribePredictorResponse x -> DescribePredictorResponse
forall x.
DescribePredictorResponse -> Rep DescribePredictorResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DescribePredictorResponse x -> DescribePredictorResponse
$cfrom :: forall x.
DescribePredictorResponse -> Rep DescribePredictorResponse x
Prelude.Generic)

-- |
-- Create a value of 'DescribePredictorResponse' 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:
--
-- 'algorithmArn', 'describePredictorResponse_algorithmArn' - The Amazon Resource Name (ARN) of the algorithm used for model training.
--
-- 'autoMLAlgorithmArns', 'describePredictorResponse_autoMLAlgorithmArns' - When @PerformAutoML@ is specified, the ARN of the chosen algorithm.
--
-- 'autoMLOverrideStrategy', 'describePredictorResponse_autoMLOverrideStrategy' - The @LatencyOptimized@ AutoML override strategy is only available in
-- private beta. Contact AWS Support or your account manager to learn more
-- about access privileges.
--
-- The AutoML strategy used to train the predictor. Unless
-- @LatencyOptimized@ is specified, the AutoML strategy optimizes predictor
-- accuracy.
--
-- This parameter is only valid for predictors trained using AutoML.
--
-- 'creationTime', 'describePredictorResponse_creationTime' - When the model training task was created.
--
-- 'datasetImportJobArns', 'describePredictorResponse_datasetImportJobArns' - An array of the ARNs of the dataset import jobs used to import training
-- data for the predictor.
--
-- 'encryptionConfig', 'describePredictorResponse_encryptionConfig' - An AWS Key Management Service (KMS) key and the AWS Identity and Access
-- Management (IAM) role that Amazon Forecast can assume to access the key.
--
-- 'estimatedTimeRemainingInMinutes', 'describePredictorResponse_estimatedTimeRemainingInMinutes' - The estimated time remaining in minutes for the predictor training job
-- to complete.
--
-- 'evaluationParameters', 'describePredictorResponse_evaluationParameters' - Used to override the default evaluation parameters of the specified
-- algorithm. Amazon Forecast evaluates a predictor by splitting a dataset
-- into training data and testing data. The evaluation parameters define
-- how to perform the split and the number of iterations.
--
-- 'featurizationConfig', 'describePredictorResponse_featurizationConfig' - The featurization configuration.
--
-- 'forecastHorizon', 'describePredictorResponse_forecastHorizon' - The number of time-steps of the forecast. The forecast horizon is also
-- called the prediction length.
--
-- 'forecastTypes', 'describePredictorResponse_forecastTypes' - The forecast types used during predictor training. Default value is
-- @[\"0.1\",\"0.5\",\"0.9\"]@
--
-- 'hPOConfig', 'describePredictorResponse_hPOConfig' - The hyperparameter override values for the algorithm.
--
-- 'inputDataConfig', 'describePredictorResponse_inputDataConfig' - Describes the dataset group that contains the data to use to train the
-- predictor.
--
-- 'isAutoPredictor', 'describePredictorResponse_isAutoPredictor' - Whether the predictor was created with CreateAutoPredictor.
--
-- 'lastModificationTime', 'describePredictorResponse_lastModificationTime' - The last time the resource was modified. The timestamp depends on the
-- status of the job:
--
-- -   @CREATE_PENDING@ - The @CreationTime@.
--
-- -   @CREATE_IN_PROGRESS@ - The current timestamp.
--
-- -   @CREATE_STOPPING@ - The current timestamp.
--
-- -   @CREATE_STOPPED@ - When the job stopped.
--
-- -   @ACTIVE@ or @CREATE_FAILED@ - When the job finished or failed.
--
-- 'message', 'describePredictorResponse_message' - If an error occurred, an informational message about the error.
--
-- 'optimizationMetric', 'describePredictorResponse_optimizationMetric' - The accuracy metric used to optimize the predictor.
--
-- 'performAutoML', 'describePredictorResponse_performAutoML' - Whether the predictor is set to perform AutoML.
--
-- 'performHPO', 'describePredictorResponse_performHPO' - Whether the predictor is set to perform hyperparameter optimization
-- (HPO).
--
-- 'predictorArn', 'describePredictorResponse_predictorArn' - The ARN of the predictor.
--
-- 'predictorExecutionDetails', 'describePredictorResponse_predictorExecutionDetails' - Details on the the status and results of the backtests performed to
-- evaluate the accuracy of the predictor. You specify the number of
-- backtests to perform when you call the operation.
--
-- 'predictorName', 'describePredictorResponse_predictorName' - The name of the predictor.
--
-- 'status', 'describePredictorResponse_status' - The status of the predictor. States include:
--
-- -   @ACTIVE@
--
-- -   @CREATE_PENDING@, @CREATE_IN_PROGRESS@, @CREATE_FAILED@
--
-- -   @DELETE_PENDING@, @DELETE_IN_PROGRESS@, @DELETE_FAILED@
--
-- -   @CREATE_STOPPING@, @CREATE_STOPPED@
--
-- The @Status@ of the predictor must be @ACTIVE@ before you can use the
-- predictor to create a forecast.
--
-- 'trainingParameters', 'describePredictorResponse_trainingParameters' - The default training parameters or overrides selected during model
-- training. When running AutoML or choosing HPO with CNN-QR or DeepAR+,
-- the optimized values for the chosen hyperparameters are returned. For
-- more information, see aws-forecast-choosing-recipes.
--
-- 'httpStatus', 'describePredictorResponse_httpStatus' - The response's http status code.
newDescribePredictorResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  DescribePredictorResponse
newDescribePredictorResponse :: Int -> DescribePredictorResponse
newDescribePredictorResponse Int
pHttpStatus_ =
  DescribePredictorResponse'
    { $sel:algorithmArn:DescribePredictorResponse' :: Maybe Text
algorithmArn =
        forall a. Maybe a
Prelude.Nothing,
      $sel:autoMLAlgorithmArns:DescribePredictorResponse' :: Maybe [Text]
autoMLAlgorithmArns = forall a. Maybe a
Prelude.Nothing,
      $sel:autoMLOverrideStrategy:DescribePredictorResponse' :: Maybe AutoMLOverrideStrategy
autoMLOverrideStrategy = forall a. Maybe a
Prelude.Nothing,
      $sel:creationTime:DescribePredictorResponse' :: Maybe POSIX
creationTime = forall a. Maybe a
Prelude.Nothing,
      $sel:datasetImportJobArns:DescribePredictorResponse' :: Maybe [Text]
datasetImportJobArns = forall a. Maybe a
Prelude.Nothing,
      $sel:encryptionConfig:DescribePredictorResponse' :: Maybe EncryptionConfig
encryptionConfig = forall a. Maybe a
Prelude.Nothing,
      $sel:estimatedTimeRemainingInMinutes:DescribePredictorResponse' :: Maybe Integer
estimatedTimeRemainingInMinutes =
        forall a. Maybe a
Prelude.Nothing,
      $sel:evaluationParameters:DescribePredictorResponse' :: Maybe EvaluationParameters
evaluationParameters = forall a. Maybe a
Prelude.Nothing,
      $sel:featurizationConfig:DescribePredictorResponse' :: Maybe FeaturizationConfig
featurizationConfig = forall a. Maybe a
Prelude.Nothing,
      $sel:forecastHorizon:DescribePredictorResponse' :: Maybe Int
forecastHorizon = forall a. Maybe a
Prelude.Nothing,
      $sel:forecastTypes:DescribePredictorResponse' :: Maybe (NonEmpty Text)
forecastTypes = forall a. Maybe a
Prelude.Nothing,
      $sel:hPOConfig:DescribePredictorResponse' :: Maybe HyperParameterTuningJobConfig
hPOConfig = forall a. Maybe a
Prelude.Nothing,
      $sel:inputDataConfig:DescribePredictorResponse' :: Maybe InputDataConfig
inputDataConfig = forall a. Maybe a
Prelude.Nothing,
      $sel:isAutoPredictor:DescribePredictorResponse' :: Maybe Bool
isAutoPredictor = forall a. Maybe a
Prelude.Nothing,
      $sel:lastModificationTime:DescribePredictorResponse' :: Maybe POSIX
lastModificationTime = forall a. Maybe a
Prelude.Nothing,
      $sel:message:DescribePredictorResponse' :: Maybe Text
message = forall a. Maybe a
Prelude.Nothing,
      $sel:optimizationMetric:DescribePredictorResponse' :: Maybe OptimizationMetric
optimizationMetric = forall a. Maybe a
Prelude.Nothing,
      $sel:performAutoML:DescribePredictorResponse' :: Maybe Bool
performAutoML = forall a. Maybe a
Prelude.Nothing,
      $sel:performHPO:DescribePredictorResponse' :: Maybe Bool
performHPO = forall a. Maybe a
Prelude.Nothing,
      $sel:predictorArn:DescribePredictorResponse' :: Maybe Text
predictorArn = forall a. Maybe a
Prelude.Nothing,
      $sel:predictorExecutionDetails:DescribePredictorResponse' :: Maybe PredictorExecutionDetails
predictorExecutionDetails = forall a. Maybe a
Prelude.Nothing,
      $sel:predictorName:DescribePredictorResponse' :: Maybe Text
predictorName = forall a. Maybe a
Prelude.Nothing,
      $sel:status:DescribePredictorResponse' :: Maybe Text
status = forall a. Maybe a
Prelude.Nothing,
      $sel:trainingParameters:DescribePredictorResponse' :: Maybe (HashMap Text Text)
trainingParameters = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:DescribePredictorResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The Amazon Resource Name (ARN) of the algorithm used for model training.
describePredictorResponse_algorithmArn :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe Prelude.Text)
describePredictorResponse_algorithmArn :: Lens' DescribePredictorResponse (Maybe Text)
describePredictorResponse_algorithmArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe Text
algorithmArn :: Maybe Text
$sel:algorithmArn:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Text
algorithmArn} -> Maybe Text
algorithmArn) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe Text
a -> DescribePredictorResponse
s {$sel:algorithmArn:DescribePredictorResponse' :: Maybe Text
algorithmArn = Maybe Text
a} :: DescribePredictorResponse)

-- | When @PerformAutoML@ is specified, the ARN of the chosen algorithm.
describePredictorResponse_autoMLAlgorithmArns :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe [Prelude.Text])
describePredictorResponse_autoMLAlgorithmArns :: Lens' DescribePredictorResponse (Maybe [Text])
describePredictorResponse_autoMLAlgorithmArns = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe [Text]
autoMLAlgorithmArns :: Maybe [Text]
$sel:autoMLAlgorithmArns:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe [Text]
autoMLAlgorithmArns} -> Maybe [Text]
autoMLAlgorithmArns) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe [Text]
a -> DescribePredictorResponse
s {$sel:autoMLAlgorithmArns:DescribePredictorResponse' :: Maybe [Text]
autoMLAlgorithmArns = Maybe [Text]
a} :: DescribePredictorResponse) 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

-- | The @LatencyOptimized@ AutoML override strategy is only available in
-- private beta. Contact AWS Support or your account manager to learn more
-- about access privileges.
--
-- The AutoML strategy used to train the predictor. Unless
-- @LatencyOptimized@ is specified, the AutoML strategy optimizes predictor
-- accuracy.
--
-- This parameter is only valid for predictors trained using AutoML.
describePredictorResponse_autoMLOverrideStrategy :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe AutoMLOverrideStrategy)
describePredictorResponse_autoMLOverrideStrategy :: Lens' DescribePredictorResponse (Maybe AutoMLOverrideStrategy)
describePredictorResponse_autoMLOverrideStrategy = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe AutoMLOverrideStrategy
autoMLOverrideStrategy :: Maybe AutoMLOverrideStrategy
$sel:autoMLOverrideStrategy:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe AutoMLOverrideStrategy
autoMLOverrideStrategy} -> Maybe AutoMLOverrideStrategy
autoMLOverrideStrategy) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe AutoMLOverrideStrategy
a -> DescribePredictorResponse
s {$sel:autoMLOverrideStrategy:DescribePredictorResponse' :: Maybe AutoMLOverrideStrategy
autoMLOverrideStrategy = Maybe AutoMLOverrideStrategy
a} :: DescribePredictorResponse)

-- | When the model training task was created.
describePredictorResponse_creationTime :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe Prelude.UTCTime)
describePredictorResponse_creationTime :: Lens' DescribePredictorResponse (Maybe UTCTime)
describePredictorResponse_creationTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe POSIX
creationTime :: Maybe POSIX
$sel:creationTime:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe POSIX
creationTime} -> Maybe POSIX
creationTime) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe POSIX
a -> DescribePredictorResponse
s {$sel:creationTime:DescribePredictorResponse' :: Maybe POSIX
creationTime = Maybe POSIX
a} :: DescribePredictorResponse) 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

-- | An array of the ARNs of the dataset import jobs used to import training
-- data for the predictor.
describePredictorResponse_datasetImportJobArns :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe [Prelude.Text])
describePredictorResponse_datasetImportJobArns :: Lens' DescribePredictorResponse (Maybe [Text])
describePredictorResponse_datasetImportJobArns = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe [Text]
datasetImportJobArns :: Maybe [Text]
$sel:datasetImportJobArns:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe [Text]
datasetImportJobArns} -> Maybe [Text]
datasetImportJobArns) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe [Text]
a -> DescribePredictorResponse
s {$sel:datasetImportJobArns:DescribePredictorResponse' :: Maybe [Text]
datasetImportJobArns = Maybe [Text]
a} :: DescribePredictorResponse) 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

-- | An AWS Key Management Service (KMS) key and the AWS Identity and Access
-- Management (IAM) role that Amazon Forecast can assume to access the key.
describePredictorResponse_encryptionConfig :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe EncryptionConfig)
describePredictorResponse_encryptionConfig :: Lens' DescribePredictorResponse (Maybe EncryptionConfig)
describePredictorResponse_encryptionConfig = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe EncryptionConfig
encryptionConfig :: Maybe EncryptionConfig
$sel:encryptionConfig:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe EncryptionConfig
encryptionConfig} -> Maybe EncryptionConfig
encryptionConfig) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe EncryptionConfig
a -> DescribePredictorResponse
s {$sel:encryptionConfig:DescribePredictorResponse' :: Maybe EncryptionConfig
encryptionConfig = Maybe EncryptionConfig
a} :: DescribePredictorResponse)

-- | The estimated time remaining in minutes for the predictor training job
-- to complete.
describePredictorResponse_estimatedTimeRemainingInMinutes :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe Prelude.Integer)
describePredictorResponse_estimatedTimeRemainingInMinutes :: Lens' DescribePredictorResponse (Maybe Integer)
describePredictorResponse_estimatedTimeRemainingInMinutes = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe Integer
estimatedTimeRemainingInMinutes :: Maybe Integer
$sel:estimatedTimeRemainingInMinutes:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Integer
estimatedTimeRemainingInMinutes} -> Maybe Integer
estimatedTimeRemainingInMinutes) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe Integer
a -> DescribePredictorResponse
s {$sel:estimatedTimeRemainingInMinutes:DescribePredictorResponse' :: Maybe Integer
estimatedTimeRemainingInMinutes = Maybe Integer
a} :: DescribePredictorResponse)

-- | Used to override the default evaluation parameters of the specified
-- algorithm. Amazon Forecast evaluates a predictor by splitting a dataset
-- into training data and testing data. The evaluation parameters define
-- how to perform the split and the number of iterations.
describePredictorResponse_evaluationParameters :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe EvaluationParameters)
describePredictorResponse_evaluationParameters :: Lens' DescribePredictorResponse (Maybe EvaluationParameters)
describePredictorResponse_evaluationParameters = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe EvaluationParameters
evaluationParameters :: Maybe EvaluationParameters
$sel:evaluationParameters:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe EvaluationParameters
evaluationParameters} -> Maybe EvaluationParameters
evaluationParameters) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe EvaluationParameters
a -> DescribePredictorResponse
s {$sel:evaluationParameters:DescribePredictorResponse' :: Maybe EvaluationParameters
evaluationParameters = Maybe EvaluationParameters
a} :: DescribePredictorResponse)

-- | The featurization configuration.
describePredictorResponse_featurizationConfig :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe FeaturizationConfig)
describePredictorResponse_featurizationConfig :: Lens' DescribePredictorResponse (Maybe FeaturizationConfig)
describePredictorResponse_featurizationConfig = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe FeaturizationConfig
featurizationConfig :: Maybe FeaturizationConfig
$sel:featurizationConfig:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe FeaturizationConfig
featurizationConfig} -> Maybe FeaturizationConfig
featurizationConfig) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe FeaturizationConfig
a -> DescribePredictorResponse
s {$sel:featurizationConfig:DescribePredictorResponse' :: Maybe FeaturizationConfig
featurizationConfig = Maybe FeaturizationConfig
a} :: DescribePredictorResponse)

-- | The number of time-steps of the forecast. The forecast horizon is also
-- called the prediction length.
describePredictorResponse_forecastHorizon :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe Prelude.Int)
describePredictorResponse_forecastHorizon :: Lens' DescribePredictorResponse (Maybe Int)
describePredictorResponse_forecastHorizon = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe Int
forecastHorizon :: Maybe Int
$sel:forecastHorizon:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Int
forecastHorizon} -> Maybe Int
forecastHorizon) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe Int
a -> DescribePredictorResponse
s {$sel:forecastHorizon:DescribePredictorResponse' :: Maybe Int
forecastHorizon = Maybe Int
a} :: DescribePredictorResponse)

-- | The forecast types used during predictor training. Default value is
-- @[\"0.1\",\"0.5\",\"0.9\"]@
describePredictorResponse_forecastTypes :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe (Prelude.NonEmpty Prelude.Text))
describePredictorResponse_forecastTypes :: Lens' DescribePredictorResponse (Maybe (NonEmpty Text))
describePredictorResponse_forecastTypes = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe (NonEmpty Text)
forecastTypes :: Maybe (NonEmpty Text)
$sel:forecastTypes:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe (NonEmpty Text)
forecastTypes} -> Maybe (NonEmpty Text)
forecastTypes) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe (NonEmpty Text)
a -> DescribePredictorResponse
s {$sel:forecastTypes:DescribePredictorResponse' :: Maybe (NonEmpty Text)
forecastTypes = Maybe (NonEmpty Text)
a} :: DescribePredictorResponse) 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

-- | The hyperparameter override values for the algorithm.
describePredictorResponse_hPOConfig :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe HyperParameterTuningJobConfig)
describePredictorResponse_hPOConfig :: Lens'
  DescribePredictorResponse (Maybe HyperParameterTuningJobConfig)
describePredictorResponse_hPOConfig = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe HyperParameterTuningJobConfig
hPOConfig :: Maybe HyperParameterTuningJobConfig
$sel:hPOConfig:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe HyperParameterTuningJobConfig
hPOConfig} -> Maybe HyperParameterTuningJobConfig
hPOConfig) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe HyperParameterTuningJobConfig
a -> DescribePredictorResponse
s {$sel:hPOConfig:DescribePredictorResponse' :: Maybe HyperParameterTuningJobConfig
hPOConfig = Maybe HyperParameterTuningJobConfig
a} :: DescribePredictorResponse)

-- | Describes the dataset group that contains the data to use to train the
-- predictor.
describePredictorResponse_inputDataConfig :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe InputDataConfig)
describePredictorResponse_inputDataConfig :: Lens' DescribePredictorResponse (Maybe InputDataConfig)
describePredictorResponse_inputDataConfig = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe InputDataConfig
inputDataConfig :: Maybe InputDataConfig
$sel:inputDataConfig:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe InputDataConfig
inputDataConfig} -> Maybe InputDataConfig
inputDataConfig) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe InputDataConfig
a -> DescribePredictorResponse
s {$sel:inputDataConfig:DescribePredictorResponse' :: Maybe InputDataConfig
inputDataConfig = Maybe InputDataConfig
a} :: DescribePredictorResponse)

-- | Whether the predictor was created with CreateAutoPredictor.
describePredictorResponse_isAutoPredictor :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe Prelude.Bool)
describePredictorResponse_isAutoPredictor :: Lens' DescribePredictorResponse (Maybe Bool)
describePredictorResponse_isAutoPredictor = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe Bool
isAutoPredictor :: Maybe Bool
$sel:isAutoPredictor:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Bool
isAutoPredictor} -> Maybe Bool
isAutoPredictor) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe Bool
a -> DescribePredictorResponse
s {$sel:isAutoPredictor:DescribePredictorResponse' :: Maybe Bool
isAutoPredictor = Maybe Bool
a} :: DescribePredictorResponse)

-- | The last time the resource was modified. The timestamp depends on the
-- status of the job:
--
-- -   @CREATE_PENDING@ - The @CreationTime@.
--
-- -   @CREATE_IN_PROGRESS@ - The current timestamp.
--
-- -   @CREATE_STOPPING@ - The current timestamp.
--
-- -   @CREATE_STOPPED@ - When the job stopped.
--
-- -   @ACTIVE@ or @CREATE_FAILED@ - When the job finished or failed.
describePredictorResponse_lastModificationTime :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe Prelude.UTCTime)
describePredictorResponse_lastModificationTime :: Lens' DescribePredictorResponse (Maybe UTCTime)
describePredictorResponse_lastModificationTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe POSIX
lastModificationTime :: Maybe POSIX
$sel:lastModificationTime:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe POSIX
lastModificationTime} -> Maybe POSIX
lastModificationTime) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe POSIX
a -> DescribePredictorResponse
s {$sel:lastModificationTime:DescribePredictorResponse' :: Maybe POSIX
lastModificationTime = Maybe POSIX
a} :: DescribePredictorResponse) 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

-- | If an error occurred, an informational message about the error.
describePredictorResponse_message :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe Prelude.Text)
describePredictorResponse_message :: Lens' DescribePredictorResponse (Maybe Text)
describePredictorResponse_message = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe Text
message :: Maybe Text
$sel:message:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Text
message} -> Maybe Text
message) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe Text
a -> DescribePredictorResponse
s {$sel:message:DescribePredictorResponse' :: Maybe Text
message = Maybe Text
a} :: DescribePredictorResponse)

-- | The accuracy metric used to optimize the predictor.
describePredictorResponse_optimizationMetric :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe OptimizationMetric)
describePredictorResponse_optimizationMetric :: Lens' DescribePredictorResponse (Maybe OptimizationMetric)
describePredictorResponse_optimizationMetric = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe OptimizationMetric
optimizationMetric :: Maybe OptimizationMetric
$sel:optimizationMetric:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe OptimizationMetric
optimizationMetric} -> Maybe OptimizationMetric
optimizationMetric) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe OptimizationMetric
a -> DescribePredictorResponse
s {$sel:optimizationMetric:DescribePredictorResponse' :: Maybe OptimizationMetric
optimizationMetric = Maybe OptimizationMetric
a} :: DescribePredictorResponse)

-- | Whether the predictor is set to perform AutoML.
describePredictorResponse_performAutoML :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe Prelude.Bool)
describePredictorResponse_performAutoML :: Lens' DescribePredictorResponse (Maybe Bool)
describePredictorResponse_performAutoML = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe Bool
performAutoML :: Maybe Bool
$sel:performAutoML:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Bool
performAutoML} -> Maybe Bool
performAutoML) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe Bool
a -> DescribePredictorResponse
s {$sel:performAutoML:DescribePredictorResponse' :: Maybe Bool
performAutoML = Maybe Bool
a} :: DescribePredictorResponse)

-- | Whether the predictor is set to perform hyperparameter optimization
-- (HPO).
describePredictorResponse_performHPO :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe Prelude.Bool)
describePredictorResponse_performHPO :: Lens' DescribePredictorResponse (Maybe Bool)
describePredictorResponse_performHPO = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe Bool
performHPO :: Maybe Bool
$sel:performHPO:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Bool
performHPO} -> Maybe Bool
performHPO) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe Bool
a -> DescribePredictorResponse
s {$sel:performHPO:DescribePredictorResponse' :: Maybe Bool
performHPO = Maybe Bool
a} :: DescribePredictorResponse)

-- | The ARN of the predictor.
describePredictorResponse_predictorArn :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe Prelude.Text)
describePredictorResponse_predictorArn :: Lens' DescribePredictorResponse (Maybe Text)
describePredictorResponse_predictorArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe Text
predictorArn :: Maybe Text
$sel:predictorArn:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Text
predictorArn} -> Maybe Text
predictorArn) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe Text
a -> DescribePredictorResponse
s {$sel:predictorArn:DescribePredictorResponse' :: Maybe Text
predictorArn = Maybe Text
a} :: DescribePredictorResponse)

-- | Details on the the status and results of the backtests performed to
-- evaluate the accuracy of the predictor. You specify the number of
-- backtests to perform when you call the operation.
describePredictorResponse_predictorExecutionDetails :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe PredictorExecutionDetails)
describePredictorResponse_predictorExecutionDetails :: Lens' DescribePredictorResponse (Maybe PredictorExecutionDetails)
describePredictorResponse_predictorExecutionDetails = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe PredictorExecutionDetails
predictorExecutionDetails :: Maybe PredictorExecutionDetails
$sel:predictorExecutionDetails:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe PredictorExecutionDetails
predictorExecutionDetails} -> Maybe PredictorExecutionDetails
predictorExecutionDetails) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe PredictorExecutionDetails
a -> DescribePredictorResponse
s {$sel:predictorExecutionDetails:DescribePredictorResponse' :: Maybe PredictorExecutionDetails
predictorExecutionDetails = Maybe PredictorExecutionDetails
a} :: DescribePredictorResponse)

-- | The name of the predictor.
describePredictorResponse_predictorName :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe Prelude.Text)
describePredictorResponse_predictorName :: Lens' DescribePredictorResponse (Maybe Text)
describePredictorResponse_predictorName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe Text
predictorName :: Maybe Text
$sel:predictorName:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Text
predictorName} -> Maybe Text
predictorName) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe Text
a -> DescribePredictorResponse
s {$sel:predictorName:DescribePredictorResponse' :: Maybe Text
predictorName = Maybe Text
a} :: DescribePredictorResponse)

-- | The status of the predictor. States include:
--
-- -   @ACTIVE@
--
-- -   @CREATE_PENDING@, @CREATE_IN_PROGRESS@, @CREATE_FAILED@
--
-- -   @DELETE_PENDING@, @DELETE_IN_PROGRESS@, @DELETE_FAILED@
--
-- -   @CREATE_STOPPING@, @CREATE_STOPPED@
--
-- The @Status@ of the predictor must be @ACTIVE@ before you can use the
-- predictor to create a forecast.
describePredictorResponse_status :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe Prelude.Text)
describePredictorResponse_status :: Lens' DescribePredictorResponse (Maybe Text)
describePredictorResponse_status = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe Text
status :: Maybe Text
$sel:status:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Text
status} -> Maybe Text
status) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe Text
a -> DescribePredictorResponse
s {$sel:status:DescribePredictorResponse' :: Maybe Text
status = Maybe Text
a} :: DescribePredictorResponse)

-- | The default training parameters or overrides selected during model
-- training. When running AutoML or choosing HPO with CNN-QR or DeepAR+,
-- the optimized values for the chosen hyperparameters are returned. For
-- more information, see aws-forecast-choosing-recipes.
describePredictorResponse_trainingParameters :: Lens.Lens' DescribePredictorResponse (Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text))
describePredictorResponse_trainingParameters :: Lens' DescribePredictorResponse (Maybe (HashMap Text Text))
describePredictorResponse_trainingParameters = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Maybe (HashMap Text Text)
trainingParameters :: Maybe (HashMap Text Text)
$sel:trainingParameters:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe (HashMap Text Text)
trainingParameters} -> Maybe (HashMap Text Text)
trainingParameters) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Maybe (HashMap Text Text)
a -> DescribePredictorResponse
s {$sel:trainingParameters:DescribePredictorResponse' :: Maybe (HashMap Text Text)
trainingParameters = Maybe (HashMap Text Text)
a} :: DescribePredictorResponse) 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

-- | The response's http status code.
describePredictorResponse_httpStatus :: Lens.Lens' DescribePredictorResponse Prelude.Int
describePredictorResponse_httpStatus :: Lens' DescribePredictorResponse Int
describePredictorResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePredictorResponse' {Int
httpStatus :: Int
$sel:httpStatus:DescribePredictorResponse' :: DescribePredictorResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: DescribePredictorResponse
s@DescribePredictorResponse' {} Int
a -> DescribePredictorResponse
s {$sel:httpStatus:DescribePredictorResponse' :: Int
httpStatus = Int
a} :: DescribePredictorResponse)

instance Prelude.NFData DescribePredictorResponse where
  rnf :: DescribePredictorResponse -> ()
rnf DescribePredictorResponse' {Int
Maybe Bool
Maybe Int
Maybe Integer
Maybe [Text]
Maybe (NonEmpty Text)
Maybe Text
Maybe (HashMap Text Text)
Maybe POSIX
Maybe AutoMLOverrideStrategy
Maybe EncryptionConfig
Maybe EvaluationParameters
Maybe FeaturizationConfig
Maybe OptimizationMetric
Maybe HyperParameterTuningJobConfig
Maybe InputDataConfig
Maybe PredictorExecutionDetails
httpStatus :: Int
trainingParameters :: Maybe (HashMap Text Text)
status :: Maybe Text
predictorName :: Maybe Text
predictorExecutionDetails :: Maybe PredictorExecutionDetails
predictorArn :: Maybe Text
performHPO :: Maybe Bool
performAutoML :: Maybe Bool
optimizationMetric :: Maybe OptimizationMetric
message :: Maybe Text
lastModificationTime :: Maybe POSIX
isAutoPredictor :: Maybe Bool
inputDataConfig :: Maybe InputDataConfig
hPOConfig :: Maybe HyperParameterTuningJobConfig
forecastTypes :: Maybe (NonEmpty Text)
forecastHorizon :: Maybe Int
featurizationConfig :: Maybe FeaturizationConfig
evaluationParameters :: Maybe EvaluationParameters
estimatedTimeRemainingInMinutes :: Maybe Integer
encryptionConfig :: Maybe EncryptionConfig
datasetImportJobArns :: Maybe [Text]
creationTime :: Maybe POSIX
autoMLOverrideStrategy :: Maybe AutoMLOverrideStrategy
autoMLAlgorithmArns :: Maybe [Text]
algorithmArn :: Maybe Text
$sel:httpStatus:DescribePredictorResponse' :: DescribePredictorResponse -> Int
$sel:trainingParameters:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe (HashMap Text Text)
$sel:status:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Text
$sel:predictorName:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Text
$sel:predictorExecutionDetails:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe PredictorExecutionDetails
$sel:predictorArn:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Text
$sel:performHPO:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Bool
$sel:performAutoML:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Bool
$sel:optimizationMetric:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe OptimizationMetric
$sel:message:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Text
$sel:lastModificationTime:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe POSIX
$sel:isAutoPredictor:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Bool
$sel:inputDataConfig:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe InputDataConfig
$sel:hPOConfig:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe HyperParameterTuningJobConfig
$sel:forecastTypes:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe (NonEmpty Text)
$sel:forecastHorizon:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Int
$sel:featurizationConfig:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe FeaturizationConfig
$sel:evaluationParameters:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe EvaluationParameters
$sel:estimatedTimeRemainingInMinutes:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Integer
$sel:encryptionConfig:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe EncryptionConfig
$sel:datasetImportJobArns:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe [Text]
$sel:creationTime:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe POSIX
$sel:autoMLOverrideStrategy:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe AutoMLOverrideStrategy
$sel:autoMLAlgorithmArns:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe [Text]
$sel:algorithmArn:DescribePredictorResponse' :: DescribePredictorResponse -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
algorithmArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Text]
autoMLAlgorithmArns
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe AutoMLOverrideStrategy
autoMLOverrideStrategy
      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]
datasetImportJobArns
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe EncryptionConfig
encryptionConfig
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
estimatedTimeRemainingInMinutes
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe EvaluationParameters
evaluationParameters
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe FeaturizationConfig
featurizationConfig
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
forecastHorizon
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe (NonEmpty Text)
forecastTypes
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe HyperParameterTuningJobConfig
hPOConfig
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe InputDataConfig
inputDataConfig
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
isAutoPredictor
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
lastModificationTime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
message
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe OptimizationMetric
optimizationMetric
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
performAutoML
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
performHPO
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
predictorArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe PredictorExecutionDetails
predictorExecutionDetails
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
predictorName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
status
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe (HashMap Text Text)
trainingParameters
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Int
httpStatus