{-# 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.SageMakerGeoSpatial.Types.Properties
-- 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.SageMakerGeoSpatial.Types.Properties 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

-- |
--
-- /See:/ 'newProperties' smart constructor.
data Properties = Properties'
  { Properties -> Maybe Double
eoCloudCover :: Prelude.Maybe Prelude.Double,
    Properties -> Maybe Double
landsatCloudCoverLand :: Prelude.Maybe Prelude.Double,
    Properties -> Maybe Text
platform :: Prelude.Maybe Prelude.Text,
    Properties -> Maybe Double
viewOffNadir :: Prelude.Maybe Prelude.Double,
    Properties -> Maybe Double
viewSunAzimuth :: Prelude.Maybe Prelude.Double,
    Properties -> Maybe Double
viewSunElevation :: Prelude.Maybe Prelude.Double
  }
  deriving (Properties -> Properties -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Properties -> Properties -> Bool
$c/= :: Properties -> Properties -> Bool
== :: Properties -> Properties -> Bool
$c== :: Properties -> Properties -> Bool
Prelude.Eq, ReadPrec [Properties]
ReadPrec Properties
Int -> ReadS Properties
ReadS [Properties]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [Properties]
$creadListPrec :: ReadPrec [Properties]
readPrec :: ReadPrec Properties
$creadPrec :: ReadPrec Properties
readList :: ReadS [Properties]
$creadList :: ReadS [Properties]
readsPrec :: Int -> ReadS Properties
$creadsPrec :: Int -> ReadS Properties
Prelude.Read, Int -> Properties -> ShowS
[Properties] -> ShowS
Properties -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Properties] -> ShowS
$cshowList :: [Properties] -> ShowS
show :: Properties -> String
$cshow :: Properties -> String
showsPrec :: Int -> Properties -> ShowS
$cshowsPrec :: Int -> Properties -> ShowS
Prelude.Show, forall x. Rep Properties x -> Properties
forall x. Properties -> Rep Properties x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep Properties x -> Properties
$cfrom :: forall x. Properties -> Rep Properties x
Prelude.Generic)

-- |
-- Create a value of 'Properties' 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:
--
-- 'eoCloudCover', 'properties_eoCloudCover' -
--
-- 'landsatCloudCoverLand', 'properties_landsatCloudCoverLand' -
--
-- 'platform', 'properties_platform' -
--
-- 'viewOffNadir', 'properties_viewOffNadir' -
--
-- 'viewSunAzimuth', 'properties_viewSunAzimuth' -
--
-- 'viewSunElevation', 'properties_viewSunElevation' -
newProperties ::
  Properties
newProperties :: Properties
newProperties =
  Properties'
    { $sel:eoCloudCover:Properties' :: Maybe Double
eoCloudCover = forall a. Maybe a
Prelude.Nothing,
      $sel:landsatCloudCoverLand:Properties' :: Maybe Double
landsatCloudCoverLand = forall a. Maybe a
Prelude.Nothing,
      $sel:platform:Properties' :: Maybe Text
platform = forall a. Maybe a
Prelude.Nothing,
      $sel:viewOffNadir:Properties' :: Maybe Double
viewOffNadir = forall a. Maybe a
Prelude.Nothing,
      $sel:viewSunAzimuth:Properties' :: Maybe Double
viewSunAzimuth = forall a. Maybe a
Prelude.Nothing,
      $sel:viewSunElevation:Properties' :: Maybe Double
viewSunElevation = forall a. Maybe a
Prelude.Nothing
    }

properties_eoCloudCover :: Lens.Lens' Properties (Prelude.Maybe Prelude.Double)
properties_eoCloudCover :: Lens' Properties (Maybe Double)
properties_eoCloudCover = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Properties' {Maybe Double
eoCloudCover :: Maybe Double
$sel:eoCloudCover:Properties' :: Properties -> Maybe Double
eoCloudCover} -> Maybe Double
eoCloudCover) (\s :: Properties
s@Properties' {} Maybe Double
a -> Properties
s {$sel:eoCloudCover:Properties' :: Maybe Double
eoCloudCover = Maybe Double
a} :: Properties)

properties_landsatCloudCoverLand :: Lens.Lens' Properties (Prelude.Maybe Prelude.Double)
properties_landsatCloudCoverLand :: Lens' Properties (Maybe Double)
properties_landsatCloudCoverLand = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Properties' {Maybe Double
landsatCloudCoverLand :: Maybe Double
$sel:landsatCloudCoverLand:Properties' :: Properties -> Maybe Double
landsatCloudCoverLand} -> Maybe Double
landsatCloudCoverLand) (\s :: Properties
s@Properties' {} Maybe Double
a -> Properties
s {$sel:landsatCloudCoverLand:Properties' :: Maybe Double
landsatCloudCoverLand = Maybe Double
a} :: Properties)

properties_platform :: Lens.Lens' Properties (Prelude.Maybe Prelude.Text)
properties_platform :: Lens' Properties (Maybe Text)
properties_platform = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Properties' {Maybe Text
platform :: Maybe Text
$sel:platform:Properties' :: Properties -> Maybe Text
platform} -> Maybe Text
platform) (\s :: Properties
s@Properties' {} Maybe Text
a -> Properties
s {$sel:platform:Properties' :: Maybe Text
platform = Maybe Text
a} :: Properties)

properties_viewOffNadir :: Lens.Lens' Properties (Prelude.Maybe Prelude.Double)
properties_viewOffNadir :: Lens' Properties (Maybe Double)
properties_viewOffNadir = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Properties' {Maybe Double
viewOffNadir :: Maybe Double
$sel:viewOffNadir:Properties' :: Properties -> Maybe Double
viewOffNadir} -> Maybe Double
viewOffNadir) (\s :: Properties
s@Properties' {} Maybe Double
a -> Properties
s {$sel:viewOffNadir:Properties' :: Maybe Double
viewOffNadir = Maybe Double
a} :: Properties)

properties_viewSunAzimuth :: Lens.Lens' Properties (Prelude.Maybe Prelude.Double)
properties_viewSunAzimuth :: Lens' Properties (Maybe Double)
properties_viewSunAzimuth = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Properties' {Maybe Double
viewSunAzimuth :: Maybe Double
$sel:viewSunAzimuth:Properties' :: Properties -> Maybe Double
viewSunAzimuth} -> Maybe Double
viewSunAzimuth) (\s :: Properties
s@Properties' {} Maybe Double
a -> Properties
s {$sel:viewSunAzimuth:Properties' :: Maybe Double
viewSunAzimuth = Maybe Double
a} :: Properties)

properties_viewSunElevation :: Lens.Lens' Properties (Prelude.Maybe Prelude.Double)
properties_viewSunElevation :: Lens' Properties (Maybe Double)
properties_viewSunElevation = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Properties' {Maybe Double
viewSunElevation :: Maybe Double
$sel:viewSunElevation:Properties' :: Properties -> Maybe Double
viewSunElevation} -> Maybe Double
viewSunElevation) (\s :: Properties
s@Properties' {} Maybe Double
a -> Properties
s {$sel:viewSunElevation:Properties' :: Maybe Double
viewSunElevation = Maybe Double
a} :: Properties)

instance Data.FromJSON Properties where
  parseJSON :: Value -> Parser Properties
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"Properties"
      ( \Object
x ->
          Maybe Double
-> Maybe Double
-> Maybe Text
-> Maybe Double
-> Maybe Double
-> Maybe Double
-> Properties
Properties'
            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
"EoCloudCover")
            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
"LandsatCloudCoverLand")
            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
"Platform")
            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
"ViewOffNadir")
            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
"ViewSunAzimuth")
            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
"ViewSunElevation")
      )

instance Prelude.Hashable Properties where
  hashWithSalt :: Int -> Properties -> Int
hashWithSalt Int
_salt Properties' {Maybe Double
Maybe Text
viewSunElevation :: Maybe Double
viewSunAzimuth :: Maybe Double
viewOffNadir :: Maybe Double
platform :: Maybe Text
landsatCloudCoverLand :: Maybe Double
eoCloudCover :: Maybe Double
$sel:viewSunElevation:Properties' :: Properties -> Maybe Double
$sel:viewSunAzimuth:Properties' :: Properties -> Maybe Double
$sel:viewOffNadir:Properties' :: Properties -> Maybe Double
$sel:platform:Properties' :: Properties -> Maybe Text
$sel:landsatCloudCoverLand:Properties' :: Properties -> Maybe Double
$sel:eoCloudCover:Properties' :: Properties -> Maybe Double
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Double
eoCloudCover
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Double
landsatCloudCoverLand
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
platform
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Double
viewOffNadir
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Double
viewSunAzimuth
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Double
viewSunElevation

instance Prelude.NFData Properties where
  rnf :: Properties -> ()
rnf Properties' {Maybe Double
Maybe Text
viewSunElevation :: Maybe Double
viewSunAzimuth :: Maybe Double
viewOffNadir :: Maybe Double
platform :: Maybe Text
landsatCloudCoverLand :: Maybe Double
eoCloudCover :: Maybe Double
$sel:viewSunElevation:Properties' :: Properties -> Maybe Double
$sel:viewSunAzimuth:Properties' :: Properties -> Maybe Double
$sel:viewOffNadir:Properties' :: Properties -> Maybe Double
$sel:platform:Properties' :: Properties -> Maybe Text
$sel:landsatCloudCoverLand:Properties' :: Properties -> Maybe Double
$sel:eoCloudCover:Properties' :: Properties -> Maybe Double
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Double
eoCloudCover
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Double
landsatCloudCoverLand
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
platform
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Double
viewOffNadir
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Double
viewSunAzimuth
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Double
viewSunElevation