{-# 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.KafkaConnect.DescribeWorkerConfiguration
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Returns information about a worker configuration.
module Amazonka.KafkaConnect.DescribeWorkerConfiguration
  ( -- * Creating a Request
    DescribeWorkerConfiguration (..),
    newDescribeWorkerConfiguration,

    -- * Request Lenses
    describeWorkerConfiguration_workerConfigurationArn,

    -- * Destructuring the Response
    DescribeWorkerConfigurationResponse (..),
    newDescribeWorkerConfigurationResponse,

    -- * Response Lenses
    describeWorkerConfigurationResponse_creationTime,
    describeWorkerConfigurationResponse_description,
    describeWorkerConfigurationResponse_latestRevision,
    describeWorkerConfigurationResponse_name,
    describeWorkerConfigurationResponse_workerConfigurationArn,
    describeWorkerConfigurationResponse_httpStatus,
  )
where

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

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

-- |
-- Create a value of 'DescribeWorkerConfiguration' 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:
--
-- 'workerConfigurationArn', 'describeWorkerConfiguration_workerConfigurationArn' - The Amazon Resource Name (ARN) of the worker configuration that you want
-- to get information about.
newDescribeWorkerConfiguration ::
  -- | 'workerConfigurationArn'
  Prelude.Text ->
  DescribeWorkerConfiguration
newDescribeWorkerConfiguration :: Text -> DescribeWorkerConfiguration
newDescribeWorkerConfiguration
  Text
pWorkerConfigurationArn_ =
    DescribeWorkerConfiguration'
      { $sel:workerConfigurationArn:DescribeWorkerConfiguration' :: Text
workerConfigurationArn =
          Text
pWorkerConfigurationArn_
      }

-- | The Amazon Resource Name (ARN) of the worker configuration that you want
-- to get information about.
describeWorkerConfiguration_workerConfigurationArn :: Lens.Lens' DescribeWorkerConfiguration Prelude.Text
describeWorkerConfiguration_workerConfigurationArn :: Lens' DescribeWorkerConfiguration Text
describeWorkerConfiguration_workerConfigurationArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeWorkerConfiguration' {Text
workerConfigurationArn :: Text
$sel:workerConfigurationArn:DescribeWorkerConfiguration' :: DescribeWorkerConfiguration -> Text
workerConfigurationArn} -> Text
workerConfigurationArn) (\s :: DescribeWorkerConfiguration
s@DescribeWorkerConfiguration' {} Text
a -> DescribeWorkerConfiguration
s {$sel:workerConfigurationArn:DescribeWorkerConfiguration' :: Text
workerConfigurationArn = Text
a} :: DescribeWorkerConfiguration)

instance Core.AWSRequest DescribeWorkerConfiguration where
  type
    AWSResponse DescribeWorkerConfiguration =
      DescribeWorkerConfigurationResponse
  request :: (Service -> Service)
-> DescribeWorkerConfiguration
-> Request DescribeWorkerConfiguration
request Service -> Service
overrides =
    forall a. ToRequest a => Service -> a -> Request a
Request.get (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy DescribeWorkerConfiguration
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse DescribeWorkerConfiguration)))
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 ISO8601
-> Maybe Text
-> Maybe WorkerConfigurationRevisionDescription
-> Maybe Text
-> Maybe Text
-> Int
-> DescribeWorkerConfigurationResponse
DescribeWorkerConfigurationResponse'
            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
"description")
            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
"latestRevision")
            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
"name")
            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
"workerConfigurationArn")
            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 DescribeWorkerConfiguration where
  hashWithSalt :: Int -> DescribeWorkerConfiguration -> Int
hashWithSalt Int
_salt DescribeWorkerConfiguration' {Text
workerConfigurationArn :: Text
$sel:workerConfigurationArn:DescribeWorkerConfiguration' :: DescribeWorkerConfiguration -> Text
..} =
    Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
workerConfigurationArn

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

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

instance Data.ToPath DescribeWorkerConfiguration where
  toPath :: DescribeWorkerConfiguration -> ByteString
toPath DescribeWorkerConfiguration' {Text
workerConfigurationArn :: Text
$sel:workerConfigurationArn:DescribeWorkerConfiguration' :: DescribeWorkerConfiguration -> Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"/v1/worker-configurations/",
        forall a. ToByteString a => a -> ByteString
Data.toBS Text
workerConfigurationArn
      ]

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

-- | /See:/ 'newDescribeWorkerConfigurationResponse' smart constructor.
data DescribeWorkerConfigurationResponse = DescribeWorkerConfigurationResponse'
  { -- | The time that the worker configuration was created.
    DescribeWorkerConfigurationResponse -> Maybe ISO8601
creationTime :: Prelude.Maybe Data.ISO8601,
    -- | The description of the worker configuration.
    DescribeWorkerConfigurationResponse -> Maybe Text
description :: Prelude.Maybe Prelude.Text,
    -- | The latest revision of the custom configuration.
    DescribeWorkerConfigurationResponse
-> Maybe WorkerConfigurationRevisionDescription
latestRevision :: Prelude.Maybe WorkerConfigurationRevisionDescription,
    -- | The name of the worker configuration.
    DescribeWorkerConfigurationResponse -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
    -- | The Amazon Resource Name (ARN) of the custom configuration.
    DescribeWorkerConfigurationResponse -> Maybe Text
workerConfigurationArn :: Prelude.Maybe Prelude.Text,
    -- | The response's http status code.
    DescribeWorkerConfigurationResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (DescribeWorkerConfigurationResponse
-> DescribeWorkerConfigurationResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeWorkerConfigurationResponse
-> DescribeWorkerConfigurationResponse -> Bool
$c/= :: DescribeWorkerConfigurationResponse
-> DescribeWorkerConfigurationResponse -> Bool
== :: DescribeWorkerConfigurationResponse
-> DescribeWorkerConfigurationResponse -> Bool
$c== :: DescribeWorkerConfigurationResponse
-> DescribeWorkerConfigurationResponse -> Bool
Prelude.Eq, Int -> DescribeWorkerConfigurationResponse -> ShowS
[DescribeWorkerConfigurationResponse] -> ShowS
DescribeWorkerConfigurationResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeWorkerConfigurationResponse] -> ShowS
$cshowList :: [DescribeWorkerConfigurationResponse] -> ShowS
show :: DescribeWorkerConfigurationResponse -> String
$cshow :: DescribeWorkerConfigurationResponse -> String
showsPrec :: Int -> DescribeWorkerConfigurationResponse -> ShowS
$cshowsPrec :: Int -> DescribeWorkerConfigurationResponse -> ShowS
Prelude.Show, forall x.
Rep DescribeWorkerConfigurationResponse x
-> DescribeWorkerConfigurationResponse
forall x.
DescribeWorkerConfigurationResponse
-> Rep DescribeWorkerConfigurationResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DescribeWorkerConfigurationResponse x
-> DescribeWorkerConfigurationResponse
$cfrom :: forall x.
DescribeWorkerConfigurationResponse
-> Rep DescribeWorkerConfigurationResponse x
Prelude.Generic)

-- |
-- Create a value of 'DescribeWorkerConfigurationResponse' 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', 'describeWorkerConfigurationResponse_creationTime' - The time that the worker configuration was created.
--
-- 'description', 'describeWorkerConfigurationResponse_description' - The description of the worker configuration.
--
-- 'latestRevision', 'describeWorkerConfigurationResponse_latestRevision' - The latest revision of the custom configuration.
--
-- 'name', 'describeWorkerConfigurationResponse_name' - The name of the worker configuration.
--
-- 'workerConfigurationArn', 'describeWorkerConfigurationResponse_workerConfigurationArn' - The Amazon Resource Name (ARN) of the custom configuration.
--
-- 'httpStatus', 'describeWorkerConfigurationResponse_httpStatus' - The response's http status code.
newDescribeWorkerConfigurationResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  DescribeWorkerConfigurationResponse
newDescribeWorkerConfigurationResponse :: Int -> DescribeWorkerConfigurationResponse
newDescribeWorkerConfigurationResponse Int
pHttpStatus_ =
  DescribeWorkerConfigurationResponse'
    { $sel:creationTime:DescribeWorkerConfigurationResponse' :: Maybe ISO8601
creationTime =
        forall a. Maybe a
Prelude.Nothing,
      $sel:description:DescribeWorkerConfigurationResponse' :: Maybe Text
description = forall a. Maybe a
Prelude.Nothing,
      $sel:latestRevision:DescribeWorkerConfigurationResponse' :: Maybe WorkerConfigurationRevisionDescription
latestRevision = forall a. Maybe a
Prelude.Nothing,
      $sel:name:DescribeWorkerConfigurationResponse' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:workerConfigurationArn:DescribeWorkerConfigurationResponse' :: Maybe Text
workerConfigurationArn =
        forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:DescribeWorkerConfigurationResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The time that the worker configuration was created.
describeWorkerConfigurationResponse_creationTime :: Lens.Lens' DescribeWorkerConfigurationResponse (Prelude.Maybe Prelude.UTCTime)
describeWorkerConfigurationResponse_creationTime :: Lens' DescribeWorkerConfigurationResponse (Maybe UTCTime)
describeWorkerConfigurationResponse_creationTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeWorkerConfigurationResponse' {Maybe ISO8601
creationTime :: Maybe ISO8601
$sel:creationTime:DescribeWorkerConfigurationResponse' :: DescribeWorkerConfigurationResponse -> Maybe ISO8601
creationTime} -> Maybe ISO8601
creationTime) (\s :: DescribeWorkerConfigurationResponse
s@DescribeWorkerConfigurationResponse' {} Maybe ISO8601
a -> DescribeWorkerConfigurationResponse
s {$sel:creationTime:DescribeWorkerConfigurationResponse' :: Maybe ISO8601
creationTime = Maybe ISO8601
a} :: DescribeWorkerConfigurationResponse) 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 description of the worker configuration.
describeWorkerConfigurationResponse_description :: Lens.Lens' DescribeWorkerConfigurationResponse (Prelude.Maybe Prelude.Text)
describeWorkerConfigurationResponse_description :: Lens' DescribeWorkerConfigurationResponse (Maybe Text)
describeWorkerConfigurationResponse_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeWorkerConfigurationResponse' {Maybe Text
description :: Maybe Text
$sel:description:DescribeWorkerConfigurationResponse' :: DescribeWorkerConfigurationResponse -> Maybe Text
description} -> Maybe Text
description) (\s :: DescribeWorkerConfigurationResponse
s@DescribeWorkerConfigurationResponse' {} Maybe Text
a -> DescribeWorkerConfigurationResponse
s {$sel:description:DescribeWorkerConfigurationResponse' :: Maybe Text
description = Maybe Text
a} :: DescribeWorkerConfigurationResponse)

-- | The latest revision of the custom configuration.
describeWorkerConfigurationResponse_latestRevision :: Lens.Lens' DescribeWorkerConfigurationResponse (Prelude.Maybe WorkerConfigurationRevisionDescription)
describeWorkerConfigurationResponse_latestRevision :: Lens'
  DescribeWorkerConfigurationResponse
  (Maybe WorkerConfigurationRevisionDescription)
describeWorkerConfigurationResponse_latestRevision = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeWorkerConfigurationResponse' {Maybe WorkerConfigurationRevisionDescription
latestRevision :: Maybe WorkerConfigurationRevisionDescription
$sel:latestRevision:DescribeWorkerConfigurationResponse' :: DescribeWorkerConfigurationResponse
-> Maybe WorkerConfigurationRevisionDescription
latestRevision} -> Maybe WorkerConfigurationRevisionDescription
latestRevision) (\s :: DescribeWorkerConfigurationResponse
s@DescribeWorkerConfigurationResponse' {} Maybe WorkerConfigurationRevisionDescription
a -> DescribeWorkerConfigurationResponse
s {$sel:latestRevision:DescribeWorkerConfigurationResponse' :: Maybe WorkerConfigurationRevisionDescription
latestRevision = Maybe WorkerConfigurationRevisionDescription
a} :: DescribeWorkerConfigurationResponse)

-- | The name of the worker configuration.
describeWorkerConfigurationResponse_name :: Lens.Lens' DescribeWorkerConfigurationResponse (Prelude.Maybe Prelude.Text)
describeWorkerConfigurationResponse_name :: Lens' DescribeWorkerConfigurationResponse (Maybe Text)
describeWorkerConfigurationResponse_name = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeWorkerConfigurationResponse' {Maybe Text
name :: Maybe Text
$sel:name:DescribeWorkerConfigurationResponse' :: DescribeWorkerConfigurationResponse -> Maybe Text
name} -> Maybe Text
name) (\s :: DescribeWorkerConfigurationResponse
s@DescribeWorkerConfigurationResponse' {} Maybe Text
a -> DescribeWorkerConfigurationResponse
s {$sel:name:DescribeWorkerConfigurationResponse' :: Maybe Text
name = Maybe Text
a} :: DescribeWorkerConfigurationResponse)

-- | The Amazon Resource Name (ARN) of the custom configuration.
describeWorkerConfigurationResponse_workerConfigurationArn :: Lens.Lens' DescribeWorkerConfigurationResponse (Prelude.Maybe Prelude.Text)
describeWorkerConfigurationResponse_workerConfigurationArn :: Lens' DescribeWorkerConfigurationResponse (Maybe Text)
describeWorkerConfigurationResponse_workerConfigurationArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeWorkerConfigurationResponse' {Maybe Text
workerConfigurationArn :: Maybe Text
$sel:workerConfigurationArn:DescribeWorkerConfigurationResponse' :: DescribeWorkerConfigurationResponse -> Maybe Text
workerConfigurationArn} -> Maybe Text
workerConfigurationArn) (\s :: DescribeWorkerConfigurationResponse
s@DescribeWorkerConfigurationResponse' {} Maybe Text
a -> DescribeWorkerConfigurationResponse
s {$sel:workerConfigurationArn:DescribeWorkerConfigurationResponse' :: Maybe Text
workerConfigurationArn = Maybe Text
a} :: DescribeWorkerConfigurationResponse)

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

instance
  Prelude.NFData
    DescribeWorkerConfigurationResponse
  where
  rnf :: DescribeWorkerConfigurationResponse -> ()
rnf DescribeWorkerConfigurationResponse' {Int
Maybe Text
Maybe ISO8601
Maybe WorkerConfigurationRevisionDescription
httpStatus :: Int
workerConfigurationArn :: Maybe Text
name :: Maybe Text
latestRevision :: Maybe WorkerConfigurationRevisionDescription
description :: Maybe Text
creationTime :: Maybe ISO8601
$sel:httpStatus:DescribeWorkerConfigurationResponse' :: DescribeWorkerConfigurationResponse -> Int
$sel:workerConfigurationArn:DescribeWorkerConfigurationResponse' :: DescribeWorkerConfigurationResponse -> Maybe Text
$sel:name:DescribeWorkerConfigurationResponse' :: DescribeWorkerConfigurationResponse -> Maybe Text
$sel:latestRevision:DescribeWorkerConfigurationResponse' :: DescribeWorkerConfigurationResponse
-> Maybe WorkerConfigurationRevisionDescription
$sel:description:DescribeWorkerConfigurationResponse' :: DescribeWorkerConfigurationResponse -> Maybe Text
$sel:creationTime:DescribeWorkerConfigurationResponse' :: DescribeWorkerConfigurationResponse -> Maybe ISO8601
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe ISO8601
creationTime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
description
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe WorkerConfigurationRevisionDescription
latestRevision
      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 Text
workerConfigurationArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus