{-# 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.QuickSight.Types.ForecastComputation
-- 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.QuickSight.Types.ForecastComputation where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude
import Amazonka.QuickSight.Types.DimensionField
import Amazonka.QuickSight.Types.ForecastComputationSeasonality
import Amazonka.QuickSight.Types.MeasureField

-- | The forecast computation configuration.
--
-- /See:/ 'newForecastComputation' smart constructor.
data ForecastComputation = ForecastComputation'
  { -- | The custom seasonality value setup of a forecast computation.
    ForecastComputation -> Maybe Natural
customSeasonalityValue :: Prelude.Maybe Prelude.Natural,
    -- | The lower boundary setup of a forecast computation.
    ForecastComputation -> Maybe Double
lowerBoundary :: Prelude.Maybe Prelude.Double,
    -- | The name of a computation.
    ForecastComputation -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
    -- | The periods backward setup of a forecast computation.
    ForecastComputation -> Maybe Natural
periodsBackward :: Prelude.Maybe Prelude.Natural,
    -- | The periods forward setup of a forecast computation.
    ForecastComputation -> Maybe Natural
periodsForward :: Prelude.Maybe Prelude.Natural,
    -- | The prediction interval setup of a forecast computation.
    ForecastComputation -> Maybe Natural
predictionInterval :: Prelude.Maybe Prelude.Natural,
    -- | The seasonality setup of a forecast computation. Choose one of the
    -- following options:
    --
    -- -   @AUTOMATIC@
    --
    -- -   @CUSTOM@: Checks the custom seasonality value.
    ForecastComputation -> Maybe ForecastComputationSeasonality
seasonality :: Prelude.Maybe ForecastComputationSeasonality,
    -- | The upper boundary setup of a forecast computation.
    ForecastComputation -> Maybe Double
upperBoundary :: Prelude.Maybe Prelude.Double,
    -- | The value field that is used in a computation.
    ForecastComputation -> Maybe MeasureField
value :: Prelude.Maybe MeasureField,
    -- | The ID for a computation.
    ForecastComputation -> Text
computationId :: Prelude.Text,
    -- | The time field that is used in a computation.
    ForecastComputation -> DimensionField
time :: DimensionField
  }
  deriving (ForecastComputation -> ForecastComputation -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ForecastComputation -> ForecastComputation -> Bool
$c/= :: ForecastComputation -> ForecastComputation -> Bool
== :: ForecastComputation -> ForecastComputation -> Bool
$c== :: ForecastComputation -> ForecastComputation -> Bool
Prelude.Eq, Int -> ForecastComputation -> ShowS
[ForecastComputation] -> ShowS
ForecastComputation -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ForecastComputation] -> ShowS
$cshowList :: [ForecastComputation] -> ShowS
show :: ForecastComputation -> String
$cshow :: ForecastComputation -> String
showsPrec :: Int -> ForecastComputation -> ShowS
$cshowsPrec :: Int -> ForecastComputation -> ShowS
Prelude.Show, forall x. Rep ForecastComputation x -> ForecastComputation
forall x. ForecastComputation -> Rep ForecastComputation x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep ForecastComputation x -> ForecastComputation
$cfrom :: forall x. ForecastComputation -> Rep ForecastComputation x
Prelude.Generic)

-- |
-- Create a value of 'ForecastComputation' 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:
--
-- 'customSeasonalityValue', 'forecastComputation_customSeasonalityValue' - The custom seasonality value setup of a forecast computation.
--
-- 'lowerBoundary', 'forecastComputation_lowerBoundary' - The lower boundary setup of a forecast computation.
--
-- 'name', 'forecastComputation_name' - The name of a computation.
--
-- 'periodsBackward', 'forecastComputation_periodsBackward' - The periods backward setup of a forecast computation.
--
-- 'periodsForward', 'forecastComputation_periodsForward' - The periods forward setup of a forecast computation.
--
-- 'predictionInterval', 'forecastComputation_predictionInterval' - The prediction interval setup of a forecast computation.
--
-- 'seasonality', 'forecastComputation_seasonality' - The seasonality setup of a forecast computation. Choose one of the
-- following options:
--
-- -   @AUTOMATIC@
--
-- -   @CUSTOM@: Checks the custom seasonality value.
--
-- 'upperBoundary', 'forecastComputation_upperBoundary' - The upper boundary setup of a forecast computation.
--
-- 'value', 'forecastComputation_value' - The value field that is used in a computation.
--
-- 'computationId', 'forecastComputation_computationId' - The ID for a computation.
--
-- 'time', 'forecastComputation_time' - The time field that is used in a computation.
newForecastComputation ::
  -- | 'computationId'
  Prelude.Text ->
  -- | 'time'
  DimensionField ->
  ForecastComputation
newForecastComputation :: Text -> DimensionField -> ForecastComputation
newForecastComputation Text
pComputationId_ DimensionField
pTime_ =
  ForecastComputation'
    { $sel:customSeasonalityValue:ForecastComputation' :: Maybe Natural
customSeasonalityValue =
        forall a. Maybe a
Prelude.Nothing,
      $sel:lowerBoundary:ForecastComputation' :: Maybe Double
lowerBoundary = forall a. Maybe a
Prelude.Nothing,
      $sel:name:ForecastComputation' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:periodsBackward:ForecastComputation' :: Maybe Natural
periodsBackward = forall a. Maybe a
Prelude.Nothing,
      $sel:periodsForward:ForecastComputation' :: Maybe Natural
periodsForward = forall a. Maybe a
Prelude.Nothing,
      $sel:predictionInterval:ForecastComputation' :: Maybe Natural
predictionInterval = forall a. Maybe a
Prelude.Nothing,
      $sel:seasonality:ForecastComputation' :: Maybe ForecastComputationSeasonality
seasonality = forall a. Maybe a
Prelude.Nothing,
      $sel:upperBoundary:ForecastComputation' :: Maybe Double
upperBoundary = forall a. Maybe a
Prelude.Nothing,
      $sel:value:ForecastComputation' :: Maybe MeasureField
value = forall a. Maybe a
Prelude.Nothing,
      $sel:computationId:ForecastComputation' :: Text
computationId = Text
pComputationId_,
      $sel:time:ForecastComputation' :: DimensionField
time = DimensionField
pTime_
    }

-- | The custom seasonality value setup of a forecast computation.
forecastComputation_customSeasonalityValue :: Lens.Lens' ForecastComputation (Prelude.Maybe Prelude.Natural)
forecastComputation_customSeasonalityValue :: Lens' ForecastComputation (Maybe Natural)
forecastComputation_customSeasonalityValue = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ForecastComputation' {Maybe Natural
customSeasonalityValue :: Maybe Natural
$sel:customSeasonalityValue:ForecastComputation' :: ForecastComputation -> Maybe Natural
customSeasonalityValue} -> Maybe Natural
customSeasonalityValue) (\s :: ForecastComputation
s@ForecastComputation' {} Maybe Natural
a -> ForecastComputation
s {$sel:customSeasonalityValue:ForecastComputation' :: Maybe Natural
customSeasonalityValue = Maybe Natural
a} :: ForecastComputation)

-- | The lower boundary setup of a forecast computation.
forecastComputation_lowerBoundary :: Lens.Lens' ForecastComputation (Prelude.Maybe Prelude.Double)
forecastComputation_lowerBoundary :: Lens' ForecastComputation (Maybe Double)
forecastComputation_lowerBoundary = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ForecastComputation' {Maybe Double
lowerBoundary :: Maybe Double
$sel:lowerBoundary:ForecastComputation' :: ForecastComputation -> Maybe Double
lowerBoundary} -> Maybe Double
lowerBoundary) (\s :: ForecastComputation
s@ForecastComputation' {} Maybe Double
a -> ForecastComputation
s {$sel:lowerBoundary:ForecastComputation' :: Maybe Double
lowerBoundary = Maybe Double
a} :: ForecastComputation)

-- | The name of a computation.
forecastComputation_name :: Lens.Lens' ForecastComputation (Prelude.Maybe Prelude.Text)
forecastComputation_name :: Lens' ForecastComputation (Maybe Text)
forecastComputation_name = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ForecastComputation' {Maybe Text
name :: Maybe Text
$sel:name:ForecastComputation' :: ForecastComputation -> Maybe Text
name} -> Maybe Text
name) (\s :: ForecastComputation
s@ForecastComputation' {} Maybe Text
a -> ForecastComputation
s {$sel:name:ForecastComputation' :: Maybe Text
name = Maybe Text
a} :: ForecastComputation)

-- | The periods backward setup of a forecast computation.
forecastComputation_periodsBackward :: Lens.Lens' ForecastComputation (Prelude.Maybe Prelude.Natural)
forecastComputation_periodsBackward :: Lens' ForecastComputation (Maybe Natural)
forecastComputation_periodsBackward = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ForecastComputation' {Maybe Natural
periodsBackward :: Maybe Natural
$sel:periodsBackward:ForecastComputation' :: ForecastComputation -> Maybe Natural
periodsBackward} -> Maybe Natural
periodsBackward) (\s :: ForecastComputation
s@ForecastComputation' {} Maybe Natural
a -> ForecastComputation
s {$sel:periodsBackward:ForecastComputation' :: Maybe Natural
periodsBackward = Maybe Natural
a} :: ForecastComputation)

-- | The periods forward setup of a forecast computation.
forecastComputation_periodsForward :: Lens.Lens' ForecastComputation (Prelude.Maybe Prelude.Natural)
forecastComputation_periodsForward :: Lens' ForecastComputation (Maybe Natural)
forecastComputation_periodsForward = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ForecastComputation' {Maybe Natural
periodsForward :: Maybe Natural
$sel:periodsForward:ForecastComputation' :: ForecastComputation -> Maybe Natural
periodsForward} -> Maybe Natural
periodsForward) (\s :: ForecastComputation
s@ForecastComputation' {} Maybe Natural
a -> ForecastComputation
s {$sel:periodsForward:ForecastComputation' :: Maybe Natural
periodsForward = Maybe Natural
a} :: ForecastComputation)

-- | The prediction interval setup of a forecast computation.
forecastComputation_predictionInterval :: Lens.Lens' ForecastComputation (Prelude.Maybe Prelude.Natural)
forecastComputation_predictionInterval :: Lens' ForecastComputation (Maybe Natural)
forecastComputation_predictionInterval = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ForecastComputation' {Maybe Natural
predictionInterval :: Maybe Natural
$sel:predictionInterval:ForecastComputation' :: ForecastComputation -> Maybe Natural
predictionInterval} -> Maybe Natural
predictionInterval) (\s :: ForecastComputation
s@ForecastComputation' {} Maybe Natural
a -> ForecastComputation
s {$sel:predictionInterval:ForecastComputation' :: Maybe Natural
predictionInterval = Maybe Natural
a} :: ForecastComputation)

-- | The seasonality setup of a forecast computation. Choose one of the
-- following options:
--
-- -   @AUTOMATIC@
--
-- -   @CUSTOM@: Checks the custom seasonality value.
forecastComputation_seasonality :: Lens.Lens' ForecastComputation (Prelude.Maybe ForecastComputationSeasonality)
forecastComputation_seasonality :: Lens' ForecastComputation (Maybe ForecastComputationSeasonality)
forecastComputation_seasonality = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ForecastComputation' {Maybe ForecastComputationSeasonality
seasonality :: Maybe ForecastComputationSeasonality
$sel:seasonality:ForecastComputation' :: ForecastComputation -> Maybe ForecastComputationSeasonality
seasonality} -> Maybe ForecastComputationSeasonality
seasonality) (\s :: ForecastComputation
s@ForecastComputation' {} Maybe ForecastComputationSeasonality
a -> ForecastComputation
s {$sel:seasonality:ForecastComputation' :: Maybe ForecastComputationSeasonality
seasonality = Maybe ForecastComputationSeasonality
a} :: ForecastComputation)

-- | The upper boundary setup of a forecast computation.
forecastComputation_upperBoundary :: Lens.Lens' ForecastComputation (Prelude.Maybe Prelude.Double)
forecastComputation_upperBoundary :: Lens' ForecastComputation (Maybe Double)
forecastComputation_upperBoundary = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ForecastComputation' {Maybe Double
upperBoundary :: Maybe Double
$sel:upperBoundary:ForecastComputation' :: ForecastComputation -> Maybe Double
upperBoundary} -> Maybe Double
upperBoundary) (\s :: ForecastComputation
s@ForecastComputation' {} Maybe Double
a -> ForecastComputation
s {$sel:upperBoundary:ForecastComputation' :: Maybe Double
upperBoundary = Maybe Double
a} :: ForecastComputation)

-- | The value field that is used in a computation.
forecastComputation_value :: Lens.Lens' ForecastComputation (Prelude.Maybe MeasureField)
forecastComputation_value :: Lens' ForecastComputation (Maybe MeasureField)
forecastComputation_value = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ForecastComputation' {Maybe MeasureField
value :: Maybe MeasureField
$sel:value:ForecastComputation' :: ForecastComputation -> Maybe MeasureField
value} -> Maybe MeasureField
value) (\s :: ForecastComputation
s@ForecastComputation' {} Maybe MeasureField
a -> ForecastComputation
s {$sel:value:ForecastComputation' :: Maybe MeasureField
value = Maybe MeasureField
a} :: ForecastComputation)

-- | The ID for a computation.
forecastComputation_computationId :: Lens.Lens' ForecastComputation Prelude.Text
forecastComputation_computationId :: Lens' ForecastComputation Text
forecastComputation_computationId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ForecastComputation' {Text
computationId :: Text
$sel:computationId:ForecastComputation' :: ForecastComputation -> Text
computationId} -> Text
computationId) (\s :: ForecastComputation
s@ForecastComputation' {} Text
a -> ForecastComputation
s {$sel:computationId:ForecastComputation' :: Text
computationId = Text
a} :: ForecastComputation)

-- | The time field that is used in a computation.
forecastComputation_time :: Lens.Lens' ForecastComputation DimensionField
forecastComputation_time :: Lens' ForecastComputation DimensionField
forecastComputation_time = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ForecastComputation' {DimensionField
time :: DimensionField
$sel:time:ForecastComputation' :: ForecastComputation -> DimensionField
time} -> DimensionField
time) (\s :: ForecastComputation
s@ForecastComputation' {} DimensionField
a -> ForecastComputation
s {$sel:time:ForecastComputation' :: DimensionField
time = DimensionField
a} :: ForecastComputation)

instance Data.FromJSON ForecastComputation where
  parseJSON :: Value -> Parser ForecastComputation
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"ForecastComputation"
      ( \Object
x ->
          Maybe Natural
-> Maybe Double
-> Maybe Text
-> Maybe Natural
-> Maybe Natural
-> Maybe Natural
-> Maybe ForecastComputationSeasonality
-> Maybe Double
-> Maybe MeasureField
-> Text
-> DimensionField
-> ForecastComputation
ForecastComputation'
            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
"CustomSeasonalityValue")
            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
"LowerBoundary")
            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
"Name")
            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
"PeriodsBackward")
            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
"PeriodsForward")
            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
"PredictionInterval")
            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
"Seasonality")
            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
"UpperBoundary")
            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
"Value")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser a
Data..: Key
"ComputationId")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser a
Data..: Key
"Time")
      )

instance Prelude.Hashable ForecastComputation where
  hashWithSalt :: Int -> ForecastComputation -> Int
hashWithSalt Int
_salt ForecastComputation' {Maybe Double
Maybe Natural
Maybe Text
Maybe ForecastComputationSeasonality
Maybe MeasureField
Text
DimensionField
time :: DimensionField
computationId :: Text
value :: Maybe MeasureField
upperBoundary :: Maybe Double
seasonality :: Maybe ForecastComputationSeasonality
predictionInterval :: Maybe Natural
periodsForward :: Maybe Natural
periodsBackward :: Maybe Natural
name :: Maybe Text
lowerBoundary :: Maybe Double
customSeasonalityValue :: Maybe Natural
$sel:time:ForecastComputation' :: ForecastComputation -> DimensionField
$sel:computationId:ForecastComputation' :: ForecastComputation -> Text
$sel:value:ForecastComputation' :: ForecastComputation -> Maybe MeasureField
$sel:upperBoundary:ForecastComputation' :: ForecastComputation -> Maybe Double
$sel:seasonality:ForecastComputation' :: ForecastComputation -> Maybe ForecastComputationSeasonality
$sel:predictionInterval:ForecastComputation' :: ForecastComputation -> Maybe Natural
$sel:periodsForward:ForecastComputation' :: ForecastComputation -> Maybe Natural
$sel:periodsBackward:ForecastComputation' :: ForecastComputation -> Maybe Natural
$sel:name:ForecastComputation' :: ForecastComputation -> Maybe Text
$sel:lowerBoundary:ForecastComputation' :: ForecastComputation -> Maybe Double
$sel:customSeasonalityValue:ForecastComputation' :: ForecastComputation -> Maybe Natural
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
customSeasonalityValue
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Double
lowerBoundary
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
name
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
periodsBackward
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
periodsForward
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
predictionInterval
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe ForecastComputationSeasonality
seasonality
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Double
upperBoundary
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe MeasureField
value
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
computationId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` DimensionField
time

instance Prelude.NFData ForecastComputation where
  rnf :: ForecastComputation -> ()
rnf ForecastComputation' {Maybe Double
Maybe Natural
Maybe Text
Maybe ForecastComputationSeasonality
Maybe MeasureField
Text
DimensionField
time :: DimensionField
computationId :: Text
value :: Maybe MeasureField
upperBoundary :: Maybe Double
seasonality :: Maybe ForecastComputationSeasonality
predictionInterval :: Maybe Natural
periodsForward :: Maybe Natural
periodsBackward :: Maybe Natural
name :: Maybe Text
lowerBoundary :: Maybe Double
customSeasonalityValue :: Maybe Natural
$sel:time:ForecastComputation' :: ForecastComputation -> DimensionField
$sel:computationId:ForecastComputation' :: ForecastComputation -> Text
$sel:value:ForecastComputation' :: ForecastComputation -> Maybe MeasureField
$sel:upperBoundary:ForecastComputation' :: ForecastComputation -> Maybe Double
$sel:seasonality:ForecastComputation' :: ForecastComputation -> Maybe ForecastComputationSeasonality
$sel:predictionInterval:ForecastComputation' :: ForecastComputation -> Maybe Natural
$sel:periodsForward:ForecastComputation' :: ForecastComputation -> Maybe Natural
$sel:periodsBackward:ForecastComputation' :: ForecastComputation -> Maybe Natural
$sel:name:ForecastComputation' :: ForecastComputation -> Maybe Text
$sel:lowerBoundary:ForecastComputation' :: ForecastComputation -> Maybe Double
$sel:customSeasonalityValue:ForecastComputation' :: ForecastComputation -> Maybe Natural
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
customSeasonalityValue
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Double
lowerBoundary
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
name
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
periodsBackward
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
periodsForward
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
predictionInterval
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ForecastComputationSeasonality
seasonality
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Double
upperBoundary
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe MeasureField
value
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
computationId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf DimensionField
time

instance Data.ToJSON ForecastComputation where
  toJSON :: ForecastComputation -> Value
toJSON ForecastComputation' {Maybe Double
Maybe Natural
Maybe Text
Maybe ForecastComputationSeasonality
Maybe MeasureField
Text
DimensionField
time :: DimensionField
computationId :: Text
value :: Maybe MeasureField
upperBoundary :: Maybe Double
seasonality :: Maybe ForecastComputationSeasonality
predictionInterval :: Maybe Natural
periodsForward :: Maybe Natural
periodsBackward :: Maybe Natural
name :: Maybe Text
lowerBoundary :: Maybe Double
customSeasonalityValue :: Maybe Natural
$sel:time:ForecastComputation' :: ForecastComputation -> DimensionField
$sel:computationId:ForecastComputation' :: ForecastComputation -> Text
$sel:value:ForecastComputation' :: ForecastComputation -> Maybe MeasureField
$sel:upperBoundary:ForecastComputation' :: ForecastComputation -> Maybe Double
$sel:seasonality:ForecastComputation' :: ForecastComputation -> Maybe ForecastComputationSeasonality
$sel:predictionInterval:ForecastComputation' :: ForecastComputation -> Maybe Natural
$sel:periodsForward:ForecastComputation' :: ForecastComputation -> Maybe Natural
$sel:periodsBackward:ForecastComputation' :: ForecastComputation -> Maybe Natural
$sel:name:ForecastComputation' :: ForecastComputation -> Maybe Text
$sel:lowerBoundary:ForecastComputation' :: ForecastComputation -> Maybe Double
$sel:customSeasonalityValue:ForecastComputation' :: ForecastComputation -> Maybe Natural
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"CustomSeasonalityValue" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
customSeasonalityValue,
            (Key
"LowerBoundary" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Double
lowerBoundary,
            (Key
"Name" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
name,
            (Key
"PeriodsBackward" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
periodsBackward,
            (Key
"PeriodsForward" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
periodsForward,
            (Key
"PredictionInterval" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
predictionInterval,
            (Key
"Seasonality" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ForecastComputationSeasonality
seasonality,
            (Key
"UpperBoundary" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Double
upperBoundary,
            (Key
"Value" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MeasureField
value,
            forall a. a -> Maybe a
Prelude.Just (Key
"ComputationId" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
computationId),
            forall a. a -> Maybe a
Prelude.Just (Key
"Time" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= DimensionField
time)
          ]
      )