{-# 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.KinesisVideo.DescribeEdgeConfiguration
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Describes a stream’s edge configuration that was set using the
-- @StartEdgeConfigurationUpdate@ API. Use this API to get the status of
-- the configuration if the configuration is in sync with the Edge Agent.
module Amazonka.KinesisVideo.DescribeEdgeConfiguration
  ( -- * Creating a Request
    DescribeEdgeConfiguration (..),
    newDescribeEdgeConfiguration,

    -- * Request Lenses
    describeEdgeConfiguration_streamARN,
    describeEdgeConfiguration_streamName,

    -- * Destructuring the Response
    DescribeEdgeConfigurationResponse (..),
    newDescribeEdgeConfigurationResponse,

    -- * Response Lenses
    describeEdgeConfigurationResponse_creationTime,
    describeEdgeConfigurationResponse_edgeConfig,
    describeEdgeConfigurationResponse_failedStatusDetails,
    describeEdgeConfigurationResponse_lastUpdatedTime,
    describeEdgeConfigurationResponse_streamARN,
    describeEdgeConfigurationResponse_streamName,
    describeEdgeConfigurationResponse_syncStatus,
    describeEdgeConfigurationResponse_httpStatus,
  )
where

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

-- | /See:/ 'newDescribeEdgeConfiguration' smart constructor.
data DescribeEdgeConfiguration = DescribeEdgeConfiguration'
  { -- | The Amazon Resource Name (ARN) of the stream. Specify either the
    -- @StreamName@or the @StreamARN@.
    DescribeEdgeConfiguration -> Maybe Text
streamARN :: Prelude.Maybe Prelude.Text,
    -- | The name of the stream whose edge configuration you want to update.
    -- Specify either the @StreamName@ or the @StreamARN@.
    DescribeEdgeConfiguration -> Maybe Text
streamName :: Prelude.Maybe Prelude.Text
  }
  deriving (DescribeEdgeConfiguration -> DescribeEdgeConfiguration -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeEdgeConfiguration -> DescribeEdgeConfiguration -> Bool
$c/= :: DescribeEdgeConfiguration -> DescribeEdgeConfiguration -> Bool
== :: DescribeEdgeConfiguration -> DescribeEdgeConfiguration -> Bool
$c== :: DescribeEdgeConfiguration -> DescribeEdgeConfiguration -> Bool
Prelude.Eq, ReadPrec [DescribeEdgeConfiguration]
ReadPrec DescribeEdgeConfiguration
Int -> ReadS DescribeEdgeConfiguration
ReadS [DescribeEdgeConfiguration]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeEdgeConfiguration]
$creadListPrec :: ReadPrec [DescribeEdgeConfiguration]
readPrec :: ReadPrec DescribeEdgeConfiguration
$creadPrec :: ReadPrec DescribeEdgeConfiguration
readList :: ReadS [DescribeEdgeConfiguration]
$creadList :: ReadS [DescribeEdgeConfiguration]
readsPrec :: Int -> ReadS DescribeEdgeConfiguration
$creadsPrec :: Int -> ReadS DescribeEdgeConfiguration
Prelude.Read, Int -> DescribeEdgeConfiguration -> ShowS
[DescribeEdgeConfiguration] -> ShowS
DescribeEdgeConfiguration -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeEdgeConfiguration] -> ShowS
$cshowList :: [DescribeEdgeConfiguration] -> ShowS
show :: DescribeEdgeConfiguration -> String
$cshow :: DescribeEdgeConfiguration -> String
showsPrec :: Int -> DescribeEdgeConfiguration -> ShowS
$cshowsPrec :: Int -> DescribeEdgeConfiguration -> ShowS
Prelude.Show, forall x.
Rep DescribeEdgeConfiguration x -> DescribeEdgeConfiguration
forall x.
DescribeEdgeConfiguration -> Rep DescribeEdgeConfiguration x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DescribeEdgeConfiguration x -> DescribeEdgeConfiguration
$cfrom :: forall x.
DescribeEdgeConfiguration -> Rep DescribeEdgeConfiguration x
Prelude.Generic)

-- |
-- Create a value of 'DescribeEdgeConfiguration' 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:
--
-- 'streamARN', 'describeEdgeConfiguration_streamARN' - The Amazon Resource Name (ARN) of the stream. Specify either the
-- @StreamName@or the @StreamARN@.
--
-- 'streamName', 'describeEdgeConfiguration_streamName' - The name of the stream whose edge configuration you want to update.
-- Specify either the @StreamName@ or the @StreamARN@.
newDescribeEdgeConfiguration ::
  DescribeEdgeConfiguration
newDescribeEdgeConfiguration :: DescribeEdgeConfiguration
newDescribeEdgeConfiguration =
  DescribeEdgeConfiguration'
    { $sel:streamARN:DescribeEdgeConfiguration' :: Maybe Text
streamARN =
        forall a. Maybe a
Prelude.Nothing,
      $sel:streamName:DescribeEdgeConfiguration' :: Maybe Text
streamName = forall a. Maybe a
Prelude.Nothing
    }

-- | The Amazon Resource Name (ARN) of the stream. Specify either the
-- @StreamName@or the @StreamARN@.
describeEdgeConfiguration_streamARN :: Lens.Lens' DescribeEdgeConfiguration (Prelude.Maybe Prelude.Text)
describeEdgeConfiguration_streamARN :: Lens' DescribeEdgeConfiguration (Maybe Text)
describeEdgeConfiguration_streamARN = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEdgeConfiguration' {Maybe Text
streamARN :: Maybe Text
$sel:streamARN:DescribeEdgeConfiguration' :: DescribeEdgeConfiguration -> Maybe Text
streamARN} -> Maybe Text
streamARN) (\s :: DescribeEdgeConfiguration
s@DescribeEdgeConfiguration' {} Maybe Text
a -> DescribeEdgeConfiguration
s {$sel:streamARN:DescribeEdgeConfiguration' :: Maybe Text
streamARN = Maybe Text
a} :: DescribeEdgeConfiguration)

-- | The name of the stream whose edge configuration you want to update.
-- Specify either the @StreamName@ or the @StreamARN@.
describeEdgeConfiguration_streamName :: Lens.Lens' DescribeEdgeConfiguration (Prelude.Maybe Prelude.Text)
describeEdgeConfiguration_streamName :: Lens' DescribeEdgeConfiguration (Maybe Text)
describeEdgeConfiguration_streamName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEdgeConfiguration' {Maybe Text
streamName :: Maybe Text
$sel:streamName:DescribeEdgeConfiguration' :: DescribeEdgeConfiguration -> Maybe Text
streamName} -> Maybe Text
streamName) (\s :: DescribeEdgeConfiguration
s@DescribeEdgeConfiguration' {} Maybe Text
a -> DescribeEdgeConfiguration
s {$sel:streamName:DescribeEdgeConfiguration' :: Maybe Text
streamName = Maybe Text
a} :: DescribeEdgeConfiguration)

instance Core.AWSRequest DescribeEdgeConfiguration where
  type
    AWSResponse DescribeEdgeConfiguration =
      DescribeEdgeConfigurationResponse
  request :: (Service -> Service)
-> DescribeEdgeConfiguration -> Request DescribeEdgeConfiguration
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 DescribeEdgeConfiguration
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse DescribeEdgeConfiguration)))
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 POSIX
-> Maybe EdgeConfig
-> Maybe Text
-> Maybe POSIX
-> Maybe Text
-> Maybe Text
-> Maybe SyncStatus
-> Int
-> DescribeEdgeConfigurationResponse
DescribeEdgeConfigurationResponse'
            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
"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
"EdgeConfig")
            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
"FailedStatusDetails")
            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
"LastUpdatedTime")
            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
"StreamARN")
            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
"StreamName")
            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
"SyncStatus")
            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 DescribeEdgeConfiguration where
  hashWithSalt :: Int -> DescribeEdgeConfiguration -> Int
hashWithSalt Int
_salt DescribeEdgeConfiguration' {Maybe Text
streamName :: Maybe Text
streamARN :: Maybe Text
$sel:streamName:DescribeEdgeConfiguration' :: DescribeEdgeConfiguration -> Maybe Text
$sel:streamARN:DescribeEdgeConfiguration' :: DescribeEdgeConfiguration -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
streamARN
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
streamName

instance Prelude.NFData DescribeEdgeConfiguration where
  rnf :: DescribeEdgeConfiguration -> ()
rnf DescribeEdgeConfiguration' {Maybe Text
streamName :: Maybe Text
streamARN :: Maybe Text
$sel:streamName:DescribeEdgeConfiguration' :: DescribeEdgeConfiguration -> Maybe Text
$sel:streamARN:DescribeEdgeConfiguration' :: DescribeEdgeConfiguration -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
streamARN
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
streamName

instance Data.ToHeaders DescribeEdgeConfiguration where
  toHeaders :: DescribeEdgeConfiguration -> ResponseHeaders
toHeaders = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty

instance Data.ToJSON DescribeEdgeConfiguration where
  toJSON :: DescribeEdgeConfiguration -> Value
toJSON DescribeEdgeConfiguration' {Maybe Text
streamName :: Maybe Text
streamARN :: Maybe Text
$sel:streamName:DescribeEdgeConfiguration' :: DescribeEdgeConfiguration -> Maybe Text
$sel:streamARN:DescribeEdgeConfiguration' :: DescribeEdgeConfiguration -> Maybe Text
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"StreamARN" 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
streamARN,
            (Key
"StreamName" 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
streamName
          ]
      )

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

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

-- | /See:/ 'newDescribeEdgeConfigurationResponse' smart constructor.
data DescribeEdgeConfigurationResponse = DescribeEdgeConfigurationResponse'
  { -- | The timestamp at which a stream’s edge configuration was first created.
    DescribeEdgeConfigurationResponse -> Maybe POSIX
creationTime :: Prelude.Maybe Data.POSIX,
    -- | A description of the stream\'s edge configuration that will be used to
    -- sync with the Edge Agent IoT Greengrass component. The Edge Agent
    -- component will run on an IoT Hub Device setup at your premise.
    DescribeEdgeConfigurationResponse -> Maybe EdgeConfig
edgeConfig :: Prelude.Maybe EdgeConfig,
    -- | A description of the generated failure status.
    DescribeEdgeConfigurationResponse -> Maybe Text
failedStatusDetails :: Prelude.Maybe Prelude.Text,
    -- | The timestamp at which a stream’s edge configuration was last updated.
    DescribeEdgeConfigurationResponse -> Maybe POSIX
lastUpdatedTime :: Prelude.Maybe Data.POSIX,
    -- | The Amazon Resource Name (ARN) of the stream.
    DescribeEdgeConfigurationResponse -> Maybe Text
streamARN :: Prelude.Maybe Prelude.Text,
    -- | The name of the stream from which the edge configuration was updated.
    DescribeEdgeConfigurationResponse -> Maybe Text
streamName :: Prelude.Maybe Prelude.Text,
    -- | The latest status of the edge configuration update.
    DescribeEdgeConfigurationResponse -> Maybe SyncStatus
syncStatus :: Prelude.Maybe SyncStatus,
    -- | The response's http status code.
    DescribeEdgeConfigurationResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (DescribeEdgeConfigurationResponse
-> DescribeEdgeConfigurationResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeEdgeConfigurationResponse
-> DescribeEdgeConfigurationResponse -> Bool
$c/= :: DescribeEdgeConfigurationResponse
-> DescribeEdgeConfigurationResponse -> Bool
== :: DescribeEdgeConfigurationResponse
-> DescribeEdgeConfigurationResponse -> Bool
$c== :: DescribeEdgeConfigurationResponse
-> DescribeEdgeConfigurationResponse -> Bool
Prelude.Eq, Int -> DescribeEdgeConfigurationResponse -> ShowS
[DescribeEdgeConfigurationResponse] -> ShowS
DescribeEdgeConfigurationResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeEdgeConfigurationResponse] -> ShowS
$cshowList :: [DescribeEdgeConfigurationResponse] -> ShowS
show :: DescribeEdgeConfigurationResponse -> String
$cshow :: DescribeEdgeConfigurationResponse -> String
showsPrec :: Int -> DescribeEdgeConfigurationResponse -> ShowS
$cshowsPrec :: Int -> DescribeEdgeConfigurationResponse -> ShowS
Prelude.Show, forall x.
Rep DescribeEdgeConfigurationResponse x
-> DescribeEdgeConfigurationResponse
forall x.
DescribeEdgeConfigurationResponse
-> Rep DescribeEdgeConfigurationResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DescribeEdgeConfigurationResponse x
-> DescribeEdgeConfigurationResponse
$cfrom :: forall x.
DescribeEdgeConfigurationResponse
-> Rep DescribeEdgeConfigurationResponse x
Prelude.Generic)

-- |
-- Create a value of 'DescribeEdgeConfigurationResponse' 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:
--
-- 'creationTime', 'describeEdgeConfigurationResponse_creationTime' - The timestamp at which a stream’s edge configuration was first created.
--
-- 'edgeConfig', 'describeEdgeConfigurationResponse_edgeConfig' - A description of the stream\'s edge configuration that will be used to
-- sync with the Edge Agent IoT Greengrass component. The Edge Agent
-- component will run on an IoT Hub Device setup at your premise.
--
-- 'failedStatusDetails', 'describeEdgeConfigurationResponse_failedStatusDetails' - A description of the generated failure status.
--
-- 'lastUpdatedTime', 'describeEdgeConfigurationResponse_lastUpdatedTime' - The timestamp at which a stream’s edge configuration was last updated.
--
-- 'streamARN', 'describeEdgeConfigurationResponse_streamARN' - The Amazon Resource Name (ARN) of the stream.
--
-- 'streamName', 'describeEdgeConfigurationResponse_streamName' - The name of the stream from which the edge configuration was updated.
--
-- 'syncStatus', 'describeEdgeConfigurationResponse_syncStatus' - The latest status of the edge configuration update.
--
-- 'httpStatus', 'describeEdgeConfigurationResponse_httpStatus' - The response's http status code.
newDescribeEdgeConfigurationResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  DescribeEdgeConfigurationResponse
newDescribeEdgeConfigurationResponse :: Int -> DescribeEdgeConfigurationResponse
newDescribeEdgeConfigurationResponse Int
pHttpStatus_ =
  DescribeEdgeConfigurationResponse'
    { $sel:creationTime:DescribeEdgeConfigurationResponse' :: Maybe POSIX
creationTime =
        forall a. Maybe a
Prelude.Nothing,
      $sel:edgeConfig:DescribeEdgeConfigurationResponse' :: Maybe EdgeConfig
edgeConfig = forall a. Maybe a
Prelude.Nothing,
      $sel:failedStatusDetails:DescribeEdgeConfigurationResponse' :: Maybe Text
failedStatusDetails = forall a. Maybe a
Prelude.Nothing,
      $sel:lastUpdatedTime:DescribeEdgeConfigurationResponse' :: Maybe POSIX
lastUpdatedTime = forall a. Maybe a
Prelude.Nothing,
      $sel:streamARN:DescribeEdgeConfigurationResponse' :: Maybe Text
streamARN = forall a. Maybe a
Prelude.Nothing,
      $sel:streamName:DescribeEdgeConfigurationResponse' :: Maybe Text
streamName = forall a. Maybe a
Prelude.Nothing,
      $sel:syncStatus:DescribeEdgeConfigurationResponse' :: Maybe SyncStatus
syncStatus = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:DescribeEdgeConfigurationResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The timestamp at which a stream’s edge configuration was first created.
describeEdgeConfigurationResponse_creationTime :: Lens.Lens' DescribeEdgeConfigurationResponse (Prelude.Maybe Prelude.UTCTime)
describeEdgeConfigurationResponse_creationTime :: Lens' DescribeEdgeConfigurationResponse (Maybe UTCTime)
describeEdgeConfigurationResponse_creationTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEdgeConfigurationResponse' {Maybe POSIX
creationTime :: Maybe POSIX
$sel:creationTime:DescribeEdgeConfigurationResponse' :: DescribeEdgeConfigurationResponse -> Maybe POSIX
creationTime} -> Maybe POSIX
creationTime) (\s :: DescribeEdgeConfigurationResponse
s@DescribeEdgeConfigurationResponse' {} Maybe POSIX
a -> DescribeEdgeConfigurationResponse
s {$sel:creationTime:DescribeEdgeConfigurationResponse' :: Maybe POSIX
creationTime = Maybe POSIX
a} :: DescribeEdgeConfigurationResponse) 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

-- | A description of the stream\'s edge configuration that will be used to
-- sync with the Edge Agent IoT Greengrass component. The Edge Agent
-- component will run on an IoT Hub Device setup at your premise.
describeEdgeConfigurationResponse_edgeConfig :: Lens.Lens' DescribeEdgeConfigurationResponse (Prelude.Maybe EdgeConfig)
describeEdgeConfigurationResponse_edgeConfig :: Lens' DescribeEdgeConfigurationResponse (Maybe EdgeConfig)
describeEdgeConfigurationResponse_edgeConfig = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEdgeConfigurationResponse' {Maybe EdgeConfig
edgeConfig :: Maybe EdgeConfig
$sel:edgeConfig:DescribeEdgeConfigurationResponse' :: DescribeEdgeConfigurationResponse -> Maybe EdgeConfig
edgeConfig} -> Maybe EdgeConfig
edgeConfig) (\s :: DescribeEdgeConfigurationResponse
s@DescribeEdgeConfigurationResponse' {} Maybe EdgeConfig
a -> DescribeEdgeConfigurationResponse
s {$sel:edgeConfig:DescribeEdgeConfigurationResponse' :: Maybe EdgeConfig
edgeConfig = Maybe EdgeConfig
a} :: DescribeEdgeConfigurationResponse)

-- | A description of the generated failure status.
describeEdgeConfigurationResponse_failedStatusDetails :: Lens.Lens' DescribeEdgeConfigurationResponse (Prelude.Maybe Prelude.Text)
describeEdgeConfigurationResponse_failedStatusDetails :: Lens' DescribeEdgeConfigurationResponse (Maybe Text)
describeEdgeConfigurationResponse_failedStatusDetails = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEdgeConfigurationResponse' {Maybe Text
failedStatusDetails :: Maybe Text
$sel:failedStatusDetails:DescribeEdgeConfigurationResponse' :: DescribeEdgeConfigurationResponse -> Maybe Text
failedStatusDetails} -> Maybe Text
failedStatusDetails) (\s :: DescribeEdgeConfigurationResponse
s@DescribeEdgeConfigurationResponse' {} Maybe Text
a -> DescribeEdgeConfigurationResponse
s {$sel:failedStatusDetails:DescribeEdgeConfigurationResponse' :: Maybe Text
failedStatusDetails = Maybe Text
a} :: DescribeEdgeConfigurationResponse)

-- | The timestamp at which a stream’s edge configuration was last updated.
describeEdgeConfigurationResponse_lastUpdatedTime :: Lens.Lens' DescribeEdgeConfigurationResponse (Prelude.Maybe Prelude.UTCTime)
describeEdgeConfigurationResponse_lastUpdatedTime :: Lens' DescribeEdgeConfigurationResponse (Maybe UTCTime)
describeEdgeConfigurationResponse_lastUpdatedTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEdgeConfigurationResponse' {Maybe POSIX
lastUpdatedTime :: Maybe POSIX
$sel:lastUpdatedTime:DescribeEdgeConfigurationResponse' :: DescribeEdgeConfigurationResponse -> Maybe POSIX
lastUpdatedTime} -> Maybe POSIX
lastUpdatedTime) (\s :: DescribeEdgeConfigurationResponse
s@DescribeEdgeConfigurationResponse' {} Maybe POSIX
a -> DescribeEdgeConfigurationResponse
s {$sel:lastUpdatedTime:DescribeEdgeConfigurationResponse' :: Maybe POSIX
lastUpdatedTime = Maybe POSIX
a} :: DescribeEdgeConfigurationResponse) 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 Amazon Resource Name (ARN) of the stream.
describeEdgeConfigurationResponse_streamARN :: Lens.Lens' DescribeEdgeConfigurationResponse (Prelude.Maybe Prelude.Text)
describeEdgeConfigurationResponse_streamARN :: Lens' DescribeEdgeConfigurationResponse (Maybe Text)
describeEdgeConfigurationResponse_streamARN = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEdgeConfigurationResponse' {Maybe Text
streamARN :: Maybe Text
$sel:streamARN:DescribeEdgeConfigurationResponse' :: DescribeEdgeConfigurationResponse -> Maybe Text
streamARN} -> Maybe Text
streamARN) (\s :: DescribeEdgeConfigurationResponse
s@DescribeEdgeConfigurationResponse' {} Maybe Text
a -> DescribeEdgeConfigurationResponse
s {$sel:streamARN:DescribeEdgeConfigurationResponse' :: Maybe Text
streamARN = Maybe Text
a} :: DescribeEdgeConfigurationResponse)

-- | The name of the stream from which the edge configuration was updated.
describeEdgeConfigurationResponse_streamName :: Lens.Lens' DescribeEdgeConfigurationResponse (Prelude.Maybe Prelude.Text)
describeEdgeConfigurationResponse_streamName :: Lens' DescribeEdgeConfigurationResponse (Maybe Text)
describeEdgeConfigurationResponse_streamName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEdgeConfigurationResponse' {Maybe Text
streamName :: Maybe Text
$sel:streamName:DescribeEdgeConfigurationResponse' :: DescribeEdgeConfigurationResponse -> Maybe Text
streamName} -> Maybe Text
streamName) (\s :: DescribeEdgeConfigurationResponse
s@DescribeEdgeConfigurationResponse' {} Maybe Text
a -> DescribeEdgeConfigurationResponse
s {$sel:streamName:DescribeEdgeConfigurationResponse' :: Maybe Text
streamName = Maybe Text
a} :: DescribeEdgeConfigurationResponse)

-- | The latest status of the edge configuration update.
describeEdgeConfigurationResponse_syncStatus :: Lens.Lens' DescribeEdgeConfigurationResponse (Prelude.Maybe SyncStatus)
describeEdgeConfigurationResponse_syncStatus :: Lens' DescribeEdgeConfigurationResponse (Maybe SyncStatus)
describeEdgeConfigurationResponse_syncStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEdgeConfigurationResponse' {Maybe SyncStatus
syncStatus :: Maybe SyncStatus
$sel:syncStatus:DescribeEdgeConfigurationResponse' :: DescribeEdgeConfigurationResponse -> Maybe SyncStatus
syncStatus} -> Maybe SyncStatus
syncStatus) (\s :: DescribeEdgeConfigurationResponse
s@DescribeEdgeConfigurationResponse' {} Maybe SyncStatus
a -> DescribeEdgeConfigurationResponse
s {$sel:syncStatus:DescribeEdgeConfigurationResponse' :: Maybe SyncStatus
syncStatus = Maybe SyncStatus
a} :: DescribeEdgeConfigurationResponse)

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

instance
  Prelude.NFData
    DescribeEdgeConfigurationResponse
  where
  rnf :: DescribeEdgeConfigurationResponse -> ()
rnf DescribeEdgeConfigurationResponse' {Int
Maybe Text
Maybe POSIX
Maybe SyncStatus
Maybe EdgeConfig
httpStatus :: Int
syncStatus :: Maybe SyncStatus
streamName :: Maybe Text
streamARN :: Maybe Text
lastUpdatedTime :: Maybe POSIX
failedStatusDetails :: Maybe Text
edgeConfig :: Maybe EdgeConfig
creationTime :: Maybe POSIX
$sel:httpStatus:DescribeEdgeConfigurationResponse' :: DescribeEdgeConfigurationResponse -> Int
$sel:syncStatus:DescribeEdgeConfigurationResponse' :: DescribeEdgeConfigurationResponse -> Maybe SyncStatus
$sel:streamName:DescribeEdgeConfigurationResponse' :: DescribeEdgeConfigurationResponse -> Maybe Text
$sel:streamARN:DescribeEdgeConfigurationResponse' :: DescribeEdgeConfigurationResponse -> Maybe Text
$sel:lastUpdatedTime:DescribeEdgeConfigurationResponse' :: DescribeEdgeConfigurationResponse -> Maybe POSIX
$sel:failedStatusDetails:DescribeEdgeConfigurationResponse' :: DescribeEdgeConfigurationResponse -> Maybe Text
$sel:edgeConfig:DescribeEdgeConfigurationResponse' :: DescribeEdgeConfigurationResponse -> Maybe EdgeConfig
$sel:creationTime:DescribeEdgeConfigurationResponse' :: DescribeEdgeConfigurationResponse -> Maybe POSIX
..} =
    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 EdgeConfig
edgeConfig
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
failedStatusDetails
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
lastUpdatedTime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
streamARN
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
streamName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe SyncStatus
syncStatus
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus