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

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

-- |
-- Module      : Amazonka.ComputeOptimizer.Types.VolumeRecommendation
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
module Amazonka.ComputeOptimizer.Types.VolumeRecommendation where

import Amazonka.ComputeOptimizer.Types.CurrentPerformanceRisk
import Amazonka.ComputeOptimizer.Types.EBSFinding
import Amazonka.ComputeOptimizer.Types.EBSUtilizationMetric
import Amazonka.ComputeOptimizer.Types.VolumeConfiguration
import Amazonka.ComputeOptimizer.Types.VolumeRecommendationOption
import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude

-- | Describes an Amazon Elastic Block Store (Amazon EBS) volume
-- recommendation.
--
-- /See:/ 'newVolumeRecommendation' smart constructor.
data VolumeRecommendation = VolumeRecommendation'
  { -- | The Amazon Web Services account ID of the volume.
    VolumeRecommendation -> Maybe Text
accountId :: Prelude.Maybe Prelude.Text,
    -- | An array of objects that describe the current configuration of the
    -- volume.
    VolumeRecommendation -> Maybe VolumeConfiguration
currentConfiguration :: Prelude.Maybe VolumeConfiguration,
    -- | The risk of the current EBS volume not meeting the performance needs of
    -- its workloads. The higher the risk, the more likely the current EBS
    -- volume doesn\'t have sufficient capacity.
    VolumeRecommendation -> Maybe CurrentPerformanceRisk
currentPerformanceRisk :: Prelude.Maybe CurrentPerformanceRisk,
    -- | The finding classification of the volume.
    --
    -- Findings for volumes include:
    --
    -- -   __@NotOptimized@__ —A volume is considered not optimized when
    --     Compute Optimizer identifies a recommendation that can provide
    --     better performance for your workload.
    --
    -- -   __@Optimized@__ —An volume is considered optimized when Compute
    --     Optimizer determines that the volume is correctly provisioned to run
    --     your workload based on the chosen volume type. For optimized
    --     resources, Compute Optimizer might recommend a new generation volume
    --     type.
    VolumeRecommendation -> Maybe EBSFinding
finding :: Prelude.Maybe EBSFinding,
    -- | The timestamp of when the volume recommendation was last generated.
    VolumeRecommendation -> Maybe POSIX
lastRefreshTimestamp :: Prelude.Maybe Data.POSIX,
    -- | The number of days for which utilization metrics were analyzed for the
    -- volume.
    VolumeRecommendation -> Maybe Double
lookBackPeriodInDays :: Prelude.Maybe Prelude.Double,
    -- | An array of objects that describe the utilization metrics of the volume.
    VolumeRecommendation -> Maybe [EBSUtilizationMetric]
utilizationMetrics :: Prelude.Maybe [EBSUtilizationMetric],
    -- | The Amazon Resource Name (ARN) of the current volume.
    VolumeRecommendation -> Maybe Text
volumeArn :: Prelude.Maybe Prelude.Text,
    -- | An array of objects that describe the recommendation options for the
    -- volume.
    VolumeRecommendation -> Maybe [VolumeRecommendationOption]
volumeRecommendationOptions :: Prelude.Maybe [VolumeRecommendationOption]
  }
  deriving (VolumeRecommendation -> VolumeRecommendation -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: VolumeRecommendation -> VolumeRecommendation -> Bool
$c/= :: VolumeRecommendation -> VolumeRecommendation -> Bool
== :: VolumeRecommendation -> VolumeRecommendation -> Bool
$c== :: VolumeRecommendation -> VolumeRecommendation -> Bool
Prelude.Eq, ReadPrec [VolumeRecommendation]
ReadPrec VolumeRecommendation
Int -> ReadS VolumeRecommendation
ReadS [VolumeRecommendation]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [VolumeRecommendation]
$creadListPrec :: ReadPrec [VolumeRecommendation]
readPrec :: ReadPrec VolumeRecommendation
$creadPrec :: ReadPrec VolumeRecommendation
readList :: ReadS [VolumeRecommendation]
$creadList :: ReadS [VolumeRecommendation]
readsPrec :: Int -> ReadS VolumeRecommendation
$creadsPrec :: Int -> ReadS VolumeRecommendation
Prelude.Read, Int -> VolumeRecommendation -> ShowS
[VolumeRecommendation] -> ShowS
VolumeRecommendation -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [VolumeRecommendation] -> ShowS
$cshowList :: [VolumeRecommendation] -> ShowS
show :: VolumeRecommendation -> String
$cshow :: VolumeRecommendation -> String
showsPrec :: Int -> VolumeRecommendation -> ShowS
$cshowsPrec :: Int -> VolumeRecommendation -> ShowS
Prelude.Show, forall x. Rep VolumeRecommendation x -> VolumeRecommendation
forall x. VolumeRecommendation -> Rep VolumeRecommendation x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep VolumeRecommendation x -> VolumeRecommendation
$cfrom :: forall x. VolumeRecommendation -> Rep VolumeRecommendation x
Prelude.Generic)

-- |
-- Create a value of 'VolumeRecommendation' 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:
--
-- 'accountId', 'volumeRecommendation_accountId' - The Amazon Web Services account ID of the volume.
--
-- 'currentConfiguration', 'volumeRecommendation_currentConfiguration' - An array of objects that describe the current configuration of the
-- volume.
--
-- 'currentPerformanceRisk', 'volumeRecommendation_currentPerformanceRisk' - The risk of the current EBS volume not meeting the performance needs of
-- its workloads. The higher the risk, the more likely the current EBS
-- volume doesn\'t have sufficient capacity.
--
-- 'finding', 'volumeRecommendation_finding' - The finding classification of the volume.
--
-- Findings for volumes include:
--
-- -   __@NotOptimized@__ —A volume is considered not optimized when
--     Compute Optimizer identifies a recommendation that can provide
--     better performance for your workload.
--
-- -   __@Optimized@__ —An volume is considered optimized when Compute
--     Optimizer determines that the volume is correctly provisioned to run
--     your workload based on the chosen volume type. For optimized
--     resources, Compute Optimizer might recommend a new generation volume
--     type.
--
-- 'lastRefreshTimestamp', 'volumeRecommendation_lastRefreshTimestamp' - The timestamp of when the volume recommendation was last generated.
--
-- 'lookBackPeriodInDays', 'volumeRecommendation_lookBackPeriodInDays' - The number of days for which utilization metrics were analyzed for the
-- volume.
--
-- 'utilizationMetrics', 'volumeRecommendation_utilizationMetrics' - An array of objects that describe the utilization metrics of the volume.
--
-- 'volumeArn', 'volumeRecommendation_volumeArn' - The Amazon Resource Name (ARN) of the current volume.
--
-- 'volumeRecommendationOptions', 'volumeRecommendation_volumeRecommendationOptions' - An array of objects that describe the recommendation options for the
-- volume.
newVolumeRecommendation ::
  VolumeRecommendation
newVolumeRecommendation :: VolumeRecommendation
newVolumeRecommendation =
  VolumeRecommendation'
    { $sel:accountId:VolumeRecommendation' :: Maybe Text
accountId = forall a. Maybe a
Prelude.Nothing,
      $sel:currentConfiguration:VolumeRecommendation' :: Maybe VolumeConfiguration
currentConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:currentPerformanceRisk:VolumeRecommendation' :: Maybe CurrentPerformanceRisk
currentPerformanceRisk = forall a. Maybe a
Prelude.Nothing,
      $sel:finding:VolumeRecommendation' :: Maybe EBSFinding
finding = forall a. Maybe a
Prelude.Nothing,
      $sel:lastRefreshTimestamp:VolumeRecommendation' :: Maybe POSIX
lastRefreshTimestamp = forall a. Maybe a
Prelude.Nothing,
      $sel:lookBackPeriodInDays:VolumeRecommendation' :: Maybe Double
lookBackPeriodInDays = forall a. Maybe a
Prelude.Nothing,
      $sel:utilizationMetrics:VolumeRecommendation' :: Maybe [EBSUtilizationMetric]
utilizationMetrics = forall a. Maybe a
Prelude.Nothing,
      $sel:volumeArn:VolumeRecommendation' :: Maybe Text
volumeArn = forall a. Maybe a
Prelude.Nothing,
      $sel:volumeRecommendationOptions:VolumeRecommendation' :: Maybe [VolumeRecommendationOption]
volumeRecommendationOptions = forall a. Maybe a
Prelude.Nothing
    }

-- | The Amazon Web Services account ID of the volume.
volumeRecommendation_accountId :: Lens.Lens' VolumeRecommendation (Prelude.Maybe Prelude.Text)
volumeRecommendation_accountId :: Lens' VolumeRecommendation (Maybe Text)
volumeRecommendation_accountId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VolumeRecommendation' {Maybe Text
accountId :: Maybe Text
$sel:accountId:VolumeRecommendation' :: VolumeRecommendation -> Maybe Text
accountId} -> Maybe Text
accountId) (\s :: VolumeRecommendation
s@VolumeRecommendation' {} Maybe Text
a -> VolumeRecommendation
s {$sel:accountId:VolumeRecommendation' :: Maybe Text
accountId = Maybe Text
a} :: VolumeRecommendation)

-- | An array of objects that describe the current configuration of the
-- volume.
volumeRecommendation_currentConfiguration :: Lens.Lens' VolumeRecommendation (Prelude.Maybe VolumeConfiguration)
volumeRecommendation_currentConfiguration :: Lens' VolumeRecommendation (Maybe VolumeConfiguration)
volumeRecommendation_currentConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VolumeRecommendation' {Maybe VolumeConfiguration
currentConfiguration :: Maybe VolumeConfiguration
$sel:currentConfiguration:VolumeRecommendation' :: VolumeRecommendation -> Maybe VolumeConfiguration
currentConfiguration} -> Maybe VolumeConfiguration
currentConfiguration) (\s :: VolumeRecommendation
s@VolumeRecommendation' {} Maybe VolumeConfiguration
a -> VolumeRecommendation
s {$sel:currentConfiguration:VolumeRecommendation' :: Maybe VolumeConfiguration
currentConfiguration = Maybe VolumeConfiguration
a} :: VolumeRecommendation)

-- | The risk of the current EBS volume not meeting the performance needs of
-- its workloads. The higher the risk, the more likely the current EBS
-- volume doesn\'t have sufficient capacity.
volumeRecommendation_currentPerformanceRisk :: Lens.Lens' VolumeRecommendation (Prelude.Maybe CurrentPerformanceRisk)
volumeRecommendation_currentPerformanceRisk :: Lens' VolumeRecommendation (Maybe CurrentPerformanceRisk)
volumeRecommendation_currentPerformanceRisk = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VolumeRecommendation' {Maybe CurrentPerformanceRisk
currentPerformanceRisk :: Maybe CurrentPerformanceRisk
$sel:currentPerformanceRisk:VolumeRecommendation' :: VolumeRecommendation -> Maybe CurrentPerformanceRisk
currentPerformanceRisk} -> Maybe CurrentPerformanceRisk
currentPerformanceRisk) (\s :: VolumeRecommendation
s@VolumeRecommendation' {} Maybe CurrentPerformanceRisk
a -> VolumeRecommendation
s {$sel:currentPerformanceRisk:VolumeRecommendation' :: Maybe CurrentPerformanceRisk
currentPerformanceRisk = Maybe CurrentPerformanceRisk
a} :: VolumeRecommendation)

-- | The finding classification of the volume.
--
-- Findings for volumes include:
--
-- -   __@NotOptimized@__ —A volume is considered not optimized when
--     Compute Optimizer identifies a recommendation that can provide
--     better performance for your workload.
--
-- -   __@Optimized@__ —An volume is considered optimized when Compute
--     Optimizer determines that the volume is correctly provisioned to run
--     your workload based on the chosen volume type. For optimized
--     resources, Compute Optimizer might recommend a new generation volume
--     type.
volumeRecommendation_finding :: Lens.Lens' VolumeRecommendation (Prelude.Maybe EBSFinding)
volumeRecommendation_finding :: Lens' VolumeRecommendation (Maybe EBSFinding)
volumeRecommendation_finding = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VolumeRecommendation' {Maybe EBSFinding
finding :: Maybe EBSFinding
$sel:finding:VolumeRecommendation' :: VolumeRecommendation -> Maybe EBSFinding
finding} -> Maybe EBSFinding
finding) (\s :: VolumeRecommendation
s@VolumeRecommendation' {} Maybe EBSFinding
a -> VolumeRecommendation
s {$sel:finding:VolumeRecommendation' :: Maybe EBSFinding
finding = Maybe EBSFinding
a} :: VolumeRecommendation)

-- | The timestamp of when the volume recommendation was last generated.
volumeRecommendation_lastRefreshTimestamp :: Lens.Lens' VolumeRecommendation (Prelude.Maybe Prelude.UTCTime)
volumeRecommendation_lastRefreshTimestamp :: Lens' VolumeRecommendation (Maybe UTCTime)
volumeRecommendation_lastRefreshTimestamp = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VolumeRecommendation' {Maybe POSIX
lastRefreshTimestamp :: Maybe POSIX
$sel:lastRefreshTimestamp:VolumeRecommendation' :: VolumeRecommendation -> Maybe POSIX
lastRefreshTimestamp} -> Maybe POSIX
lastRefreshTimestamp) (\s :: VolumeRecommendation
s@VolumeRecommendation' {} Maybe POSIX
a -> VolumeRecommendation
s {$sel:lastRefreshTimestamp:VolumeRecommendation' :: Maybe POSIX
lastRefreshTimestamp = Maybe POSIX
a} :: VolumeRecommendation) 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

-- | The number of days for which utilization metrics were analyzed for the
-- volume.
volumeRecommendation_lookBackPeriodInDays :: Lens.Lens' VolumeRecommendation (Prelude.Maybe Prelude.Double)
volumeRecommendation_lookBackPeriodInDays :: Lens' VolumeRecommendation (Maybe Double)
volumeRecommendation_lookBackPeriodInDays = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VolumeRecommendation' {Maybe Double
lookBackPeriodInDays :: Maybe Double
$sel:lookBackPeriodInDays:VolumeRecommendation' :: VolumeRecommendation -> Maybe Double
lookBackPeriodInDays} -> Maybe Double
lookBackPeriodInDays) (\s :: VolumeRecommendation
s@VolumeRecommendation' {} Maybe Double
a -> VolumeRecommendation
s {$sel:lookBackPeriodInDays:VolumeRecommendation' :: Maybe Double
lookBackPeriodInDays = Maybe Double
a} :: VolumeRecommendation)

-- | An array of objects that describe the utilization metrics of the volume.
volumeRecommendation_utilizationMetrics :: Lens.Lens' VolumeRecommendation (Prelude.Maybe [EBSUtilizationMetric])
volumeRecommendation_utilizationMetrics :: Lens' VolumeRecommendation (Maybe [EBSUtilizationMetric])
volumeRecommendation_utilizationMetrics = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VolumeRecommendation' {Maybe [EBSUtilizationMetric]
utilizationMetrics :: Maybe [EBSUtilizationMetric]
$sel:utilizationMetrics:VolumeRecommendation' :: VolumeRecommendation -> Maybe [EBSUtilizationMetric]
utilizationMetrics} -> Maybe [EBSUtilizationMetric]
utilizationMetrics) (\s :: VolumeRecommendation
s@VolumeRecommendation' {} Maybe [EBSUtilizationMetric]
a -> VolumeRecommendation
s {$sel:utilizationMetrics:VolumeRecommendation' :: Maybe [EBSUtilizationMetric]
utilizationMetrics = Maybe [EBSUtilizationMetric]
a} :: VolumeRecommendation) 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 Amazon Resource Name (ARN) of the current volume.
volumeRecommendation_volumeArn :: Lens.Lens' VolumeRecommendation (Prelude.Maybe Prelude.Text)
volumeRecommendation_volumeArn :: Lens' VolumeRecommendation (Maybe Text)
volumeRecommendation_volumeArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VolumeRecommendation' {Maybe Text
volumeArn :: Maybe Text
$sel:volumeArn:VolumeRecommendation' :: VolumeRecommendation -> Maybe Text
volumeArn} -> Maybe Text
volumeArn) (\s :: VolumeRecommendation
s@VolumeRecommendation' {} Maybe Text
a -> VolumeRecommendation
s {$sel:volumeArn:VolumeRecommendation' :: Maybe Text
volumeArn = Maybe Text
a} :: VolumeRecommendation)

-- | An array of objects that describe the recommendation options for the
-- volume.
volumeRecommendation_volumeRecommendationOptions :: Lens.Lens' VolumeRecommendation (Prelude.Maybe [VolumeRecommendationOption])
volumeRecommendation_volumeRecommendationOptions :: Lens' VolumeRecommendation (Maybe [VolumeRecommendationOption])
volumeRecommendation_volumeRecommendationOptions = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VolumeRecommendation' {Maybe [VolumeRecommendationOption]
volumeRecommendationOptions :: Maybe [VolumeRecommendationOption]
$sel:volumeRecommendationOptions:VolumeRecommendation' :: VolumeRecommendation -> Maybe [VolumeRecommendationOption]
volumeRecommendationOptions} -> Maybe [VolumeRecommendationOption]
volumeRecommendationOptions) (\s :: VolumeRecommendation
s@VolumeRecommendation' {} Maybe [VolumeRecommendationOption]
a -> VolumeRecommendation
s {$sel:volumeRecommendationOptions:VolumeRecommendation' :: Maybe [VolumeRecommendationOption]
volumeRecommendationOptions = Maybe [VolumeRecommendationOption]
a} :: VolumeRecommendation) 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

instance Data.FromJSON VolumeRecommendation where
  parseJSON :: Value -> Parser VolumeRecommendation
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"VolumeRecommendation"
      ( \Object
x ->
          Maybe Text
-> Maybe VolumeConfiguration
-> Maybe CurrentPerformanceRisk
-> Maybe EBSFinding
-> Maybe POSIX
-> Maybe Double
-> Maybe [EBSUtilizationMetric]
-> Maybe Text
-> Maybe [VolumeRecommendationOption]
-> VolumeRecommendation
VolumeRecommendation'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"accountId")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"currentConfiguration")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"currentPerformanceRisk")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"finding")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"lastRefreshTimestamp")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"lookBackPeriodInDays")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( Object
x
                            forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"utilizationMetrics"
                            forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty
                        )
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"volumeArn")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( Object
x
                            forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"volumeRecommendationOptions"
                            forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty
                        )
      )

instance Prelude.Hashable VolumeRecommendation where
  hashWithSalt :: Int -> VolumeRecommendation -> Int
hashWithSalt Int
_salt VolumeRecommendation' {Maybe Double
Maybe [EBSUtilizationMetric]
Maybe [VolumeRecommendationOption]
Maybe Text
Maybe POSIX
Maybe CurrentPerformanceRisk
Maybe EBSFinding
Maybe VolumeConfiguration
volumeRecommendationOptions :: Maybe [VolumeRecommendationOption]
volumeArn :: Maybe Text
utilizationMetrics :: Maybe [EBSUtilizationMetric]
lookBackPeriodInDays :: Maybe Double
lastRefreshTimestamp :: Maybe POSIX
finding :: Maybe EBSFinding
currentPerformanceRisk :: Maybe CurrentPerformanceRisk
currentConfiguration :: Maybe VolumeConfiguration
accountId :: Maybe Text
$sel:volumeRecommendationOptions:VolumeRecommendation' :: VolumeRecommendation -> Maybe [VolumeRecommendationOption]
$sel:volumeArn:VolumeRecommendation' :: VolumeRecommendation -> Maybe Text
$sel:utilizationMetrics:VolumeRecommendation' :: VolumeRecommendation -> Maybe [EBSUtilizationMetric]
$sel:lookBackPeriodInDays:VolumeRecommendation' :: VolumeRecommendation -> Maybe Double
$sel:lastRefreshTimestamp:VolumeRecommendation' :: VolumeRecommendation -> Maybe POSIX
$sel:finding:VolumeRecommendation' :: VolumeRecommendation -> Maybe EBSFinding
$sel:currentPerformanceRisk:VolumeRecommendation' :: VolumeRecommendation -> Maybe CurrentPerformanceRisk
$sel:currentConfiguration:VolumeRecommendation' :: VolumeRecommendation -> Maybe VolumeConfiguration
$sel:accountId:VolumeRecommendation' :: VolumeRecommendation -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
accountId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe VolumeConfiguration
currentConfiguration
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe CurrentPerformanceRisk
currentPerformanceRisk
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe EBSFinding
finding
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
lastRefreshTimestamp
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Double
lookBackPeriodInDays
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [EBSUtilizationMetric]
utilizationMetrics
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
volumeArn
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [VolumeRecommendationOption]
volumeRecommendationOptions

instance Prelude.NFData VolumeRecommendation where
  rnf :: VolumeRecommendation -> ()
rnf VolumeRecommendation' {Maybe Double
Maybe [EBSUtilizationMetric]
Maybe [VolumeRecommendationOption]
Maybe Text
Maybe POSIX
Maybe CurrentPerformanceRisk
Maybe EBSFinding
Maybe VolumeConfiguration
volumeRecommendationOptions :: Maybe [VolumeRecommendationOption]
volumeArn :: Maybe Text
utilizationMetrics :: Maybe [EBSUtilizationMetric]
lookBackPeriodInDays :: Maybe Double
lastRefreshTimestamp :: Maybe POSIX
finding :: Maybe EBSFinding
currentPerformanceRisk :: Maybe CurrentPerformanceRisk
currentConfiguration :: Maybe VolumeConfiguration
accountId :: Maybe Text
$sel:volumeRecommendationOptions:VolumeRecommendation' :: VolumeRecommendation -> Maybe [VolumeRecommendationOption]
$sel:volumeArn:VolumeRecommendation' :: VolumeRecommendation -> Maybe Text
$sel:utilizationMetrics:VolumeRecommendation' :: VolumeRecommendation -> Maybe [EBSUtilizationMetric]
$sel:lookBackPeriodInDays:VolumeRecommendation' :: VolumeRecommendation -> Maybe Double
$sel:lastRefreshTimestamp:VolumeRecommendation' :: VolumeRecommendation -> Maybe POSIX
$sel:finding:VolumeRecommendation' :: VolumeRecommendation -> Maybe EBSFinding
$sel:currentPerformanceRisk:VolumeRecommendation' :: VolumeRecommendation -> Maybe CurrentPerformanceRisk
$sel:currentConfiguration:VolumeRecommendation' :: VolumeRecommendation -> Maybe VolumeConfiguration
$sel:accountId:VolumeRecommendation' :: VolumeRecommendation -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
accountId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe VolumeConfiguration
currentConfiguration
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe CurrentPerformanceRisk
currentPerformanceRisk
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe EBSFinding
finding
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
lastRefreshTimestamp
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Double
lookBackPeriodInDays
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [EBSUtilizationMetric]
utilizationMetrics
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
volumeArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [VolumeRecommendationOption]
volumeRecommendationOptions