{-# 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.RobOMaker.DescribeWorldTemplate
-- 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 world template.
module Amazonka.RobOMaker.DescribeWorldTemplate
  ( -- * Creating a Request
    DescribeWorldTemplate (..),
    newDescribeWorldTemplate,

    -- * Request Lenses
    describeWorldTemplate_template,

    -- * Destructuring the Response
    DescribeWorldTemplateResponse (..),
    newDescribeWorldTemplateResponse,

    -- * Response Lenses
    describeWorldTemplateResponse_arn,
    describeWorldTemplateResponse_clientRequestToken,
    describeWorldTemplateResponse_createdAt,
    describeWorldTemplateResponse_lastUpdatedAt,
    describeWorldTemplateResponse_name,
    describeWorldTemplateResponse_tags,
    describeWorldTemplateResponse_version,
    describeWorldTemplateResponse_httpStatus,
  )
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 qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response
import Amazonka.RobOMaker.Types

-- | /See:/ 'newDescribeWorldTemplate' smart constructor.
data DescribeWorldTemplate = DescribeWorldTemplate'
  { -- | The Amazon Resource Name (arn) of the world template you want to
    -- describe.
    DescribeWorldTemplate -> Text
template :: Prelude.Text
  }
  deriving (DescribeWorldTemplate -> DescribeWorldTemplate -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeWorldTemplate -> DescribeWorldTemplate -> Bool
$c/= :: DescribeWorldTemplate -> DescribeWorldTemplate -> Bool
== :: DescribeWorldTemplate -> DescribeWorldTemplate -> Bool
$c== :: DescribeWorldTemplate -> DescribeWorldTemplate -> Bool
Prelude.Eq, ReadPrec [DescribeWorldTemplate]
ReadPrec DescribeWorldTemplate
Int -> ReadS DescribeWorldTemplate
ReadS [DescribeWorldTemplate]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeWorldTemplate]
$creadListPrec :: ReadPrec [DescribeWorldTemplate]
readPrec :: ReadPrec DescribeWorldTemplate
$creadPrec :: ReadPrec DescribeWorldTemplate
readList :: ReadS [DescribeWorldTemplate]
$creadList :: ReadS [DescribeWorldTemplate]
readsPrec :: Int -> ReadS DescribeWorldTemplate
$creadsPrec :: Int -> ReadS DescribeWorldTemplate
Prelude.Read, Int -> DescribeWorldTemplate -> ShowS
[DescribeWorldTemplate] -> ShowS
DescribeWorldTemplate -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeWorldTemplate] -> ShowS
$cshowList :: [DescribeWorldTemplate] -> ShowS
show :: DescribeWorldTemplate -> String
$cshow :: DescribeWorldTemplate -> String
showsPrec :: Int -> DescribeWorldTemplate -> ShowS
$cshowsPrec :: Int -> DescribeWorldTemplate -> ShowS
Prelude.Show, forall x. Rep DescribeWorldTemplate x -> DescribeWorldTemplate
forall x. DescribeWorldTemplate -> Rep DescribeWorldTemplate x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DescribeWorldTemplate x -> DescribeWorldTemplate
$cfrom :: forall x. DescribeWorldTemplate -> Rep DescribeWorldTemplate x
Prelude.Generic)

-- |
-- Create a value of 'DescribeWorldTemplate' 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:
--
-- 'template', 'describeWorldTemplate_template' - The Amazon Resource Name (arn) of the world template you want to
-- describe.
newDescribeWorldTemplate ::
  -- | 'template'
  Prelude.Text ->
  DescribeWorldTemplate
newDescribeWorldTemplate :: Text -> DescribeWorldTemplate
newDescribeWorldTemplate Text
pTemplate_ =
  DescribeWorldTemplate' {$sel:template:DescribeWorldTemplate' :: Text
template = Text
pTemplate_}

-- | The Amazon Resource Name (arn) of the world template you want to
-- describe.
describeWorldTemplate_template :: Lens.Lens' DescribeWorldTemplate Prelude.Text
describeWorldTemplate_template :: Lens' DescribeWorldTemplate Text
describeWorldTemplate_template = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeWorldTemplate' {Text
template :: Text
$sel:template:DescribeWorldTemplate' :: DescribeWorldTemplate -> Text
template} -> Text
template) (\s :: DescribeWorldTemplate
s@DescribeWorldTemplate' {} Text
a -> DescribeWorldTemplate
s {$sel:template:DescribeWorldTemplate' :: Text
template = Text
a} :: DescribeWorldTemplate)

instance Core.AWSRequest DescribeWorldTemplate where
  type
    AWSResponse DescribeWorldTemplate =
      DescribeWorldTemplateResponse
  request :: (Service -> Service)
-> DescribeWorldTemplate -> Request DescribeWorldTemplate
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 DescribeWorldTemplate
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse DescribeWorldTemplate)))
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 Text
-> Maybe Text
-> Maybe POSIX
-> Maybe POSIX
-> Maybe Text
-> Maybe (HashMap Text Text)
-> Maybe Text
-> Int
-> DescribeWorldTemplateResponse
DescribeWorldTemplateResponse'
            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
"arn")
            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
"clientRequestToken")
            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
"createdAt")
            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
"lastUpdatedAt")
            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
"tags" forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ 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 -> Either String (Maybe a)
Data..?> Key
"version")
            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 DescribeWorldTemplate where
  hashWithSalt :: Int -> DescribeWorldTemplate -> Int
hashWithSalt Int
_salt DescribeWorldTemplate' {Text
template :: Text
$sel:template:DescribeWorldTemplate' :: DescribeWorldTemplate -> Text
..} =
    Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
template

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

instance Data.ToHeaders DescribeWorldTemplate where
  toHeaders :: DescribeWorldTemplate -> 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.ToJSON DescribeWorldTemplate where
  toJSON :: DescribeWorldTemplate -> Value
toJSON DescribeWorldTemplate' {Text
template :: Text
$sel:template:DescribeWorldTemplate' :: DescribeWorldTemplate -> Text
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [forall a. a -> Maybe a
Prelude.Just (Key
"template" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
template)]
      )

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

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

-- | /See:/ 'newDescribeWorldTemplateResponse' smart constructor.
data DescribeWorldTemplateResponse = DescribeWorldTemplateResponse'
  { -- | The Amazon Resource Name (ARN) of the world template.
    DescribeWorldTemplateResponse -> Maybe Text
arn :: Prelude.Maybe Prelude.Text,
    -- | Unique, case-sensitive identifier that you provide to ensure the
    -- idempotency of the request.
    DescribeWorldTemplateResponse -> Maybe Text
clientRequestToken :: Prelude.Maybe Prelude.Text,
    -- | The time, in milliseconds since the epoch, when the world template was
    -- created.
    DescribeWorldTemplateResponse -> Maybe POSIX
createdAt :: Prelude.Maybe Data.POSIX,
    -- | The time, in milliseconds since the epoch, when the world template was
    -- last updated.
    DescribeWorldTemplateResponse -> Maybe POSIX
lastUpdatedAt :: Prelude.Maybe Data.POSIX,
    -- | The name of the world template.
    DescribeWorldTemplateResponse -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
    -- | A map that contains tag keys and tag values that are attached to the
    -- world template.
    DescribeWorldTemplateResponse -> Maybe (HashMap Text Text)
tags :: Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text),
    -- | The version of the world template that you\'re using.
    DescribeWorldTemplateResponse -> Maybe Text
version :: Prelude.Maybe Prelude.Text,
    -- | The response's http status code.
    DescribeWorldTemplateResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (DescribeWorldTemplateResponse
-> DescribeWorldTemplateResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeWorldTemplateResponse
-> DescribeWorldTemplateResponse -> Bool
$c/= :: DescribeWorldTemplateResponse
-> DescribeWorldTemplateResponse -> Bool
== :: DescribeWorldTemplateResponse
-> DescribeWorldTemplateResponse -> Bool
$c== :: DescribeWorldTemplateResponse
-> DescribeWorldTemplateResponse -> Bool
Prelude.Eq, ReadPrec [DescribeWorldTemplateResponse]
ReadPrec DescribeWorldTemplateResponse
Int -> ReadS DescribeWorldTemplateResponse
ReadS [DescribeWorldTemplateResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeWorldTemplateResponse]
$creadListPrec :: ReadPrec [DescribeWorldTemplateResponse]
readPrec :: ReadPrec DescribeWorldTemplateResponse
$creadPrec :: ReadPrec DescribeWorldTemplateResponse
readList :: ReadS [DescribeWorldTemplateResponse]
$creadList :: ReadS [DescribeWorldTemplateResponse]
readsPrec :: Int -> ReadS DescribeWorldTemplateResponse
$creadsPrec :: Int -> ReadS DescribeWorldTemplateResponse
Prelude.Read, Int -> DescribeWorldTemplateResponse -> ShowS
[DescribeWorldTemplateResponse] -> ShowS
DescribeWorldTemplateResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeWorldTemplateResponse] -> ShowS
$cshowList :: [DescribeWorldTemplateResponse] -> ShowS
show :: DescribeWorldTemplateResponse -> String
$cshow :: DescribeWorldTemplateResponse -> String
showsPrec :: Int -> DescribeWorldTemplateResponse -> ShowS
$cshowsPrec :: Int -> DescribeWorldTemplateResponse -> ShowS
Prelude.Show, forall x.
Rep DescribeWorldTemplateResponse x
-> DescribeWorldTemplateResponse
forall x.
DescribeWorldTemplateResponse
-> Rep DescribeWorldTemplateResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DescribeWorldTemplateResponse x
-> DescribeWorldTemplateResponse
$cfrom :: forall x.
DescribeWorldTemplateResponse
-> Rep DescribeWorldTemplateResponse x
Prelude.Generic)

-- |
-- Create a value of 'DescribeWorldTemplateResponse' 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:
--
-- 'arn', 'describeWorldTemplateResponse_arn' - The Amazon Resource Name (ARN) of the world template.
--
-- 'clientRequestToken', 'describeWorldTemplateResponse_clientRequestToken' - Unique, case-sensitive identifier that you provide to ensure the
-- idempotency of the request.
--
-- 'createdAt', 'describeWorldTemplateResponse_createdAt' - The time, in milliseconds since the epoch, when the world template was
-- created.
--
-- 'lastUpdatedAt', 'describeWorldTemplateResponse_lastUpdatedAt' - The time, in milliseconds since the epoch, when the world template was
-- last updated.
--
-- 'name', 'describeWorldTemplateResponse_name' - The name of the world template.
--
-- 'tags', 'describeWorldTemplateResponse_tags' - A map that contains tag keys and tag values that are attached to the
-- world template.
--
-- 'version', 'describeWorldTemplateResponse_version' - The version of the world template that you\'re using.
--
-- 'httpStatus', 'describeWorldTemplateResponse_httpStatus' - The response's http status code.
newDescribeWorldTemplateResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  DescribeWorldTemplateResponse
newDescribeWorldTemplateResponse :: Int -> DescribeWorldTemplateResponse
newDescribeWorldTemplateResponse Int
pHttpStatus_ =
  DescribeWorldTemplateResponse'
    { $sel:arn:DescribeWorldTemplateResponse' :: Maybe Text
arn =
        forall a. Maybe a
Prelude.Nothing,
      $sel:clientRequestToken:DescribeWorldTemplateResponse' :: Maybe Text
clientRequestToken = forall a. Maybe a
Prelude.Nothing,
      $sel:createdAt:DescribeWorldTemplateResponse' :: Maybe POSIX
createdAt = forall a. Maybe a
Prelude.Nothing,
      $sel:lastUpdatedAt:DescribeWorldTemplateResponse' :: Maybe POSIX
lastUpdatedAt = forall a. Maybe a
Prelude.Nothing,
      $sel:name:DescribeWorldTemplateResponse' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:tags:DescribeWorldTemplateResponse' :: Maybe (HashMap Text Text)
tags = forall a. Maybe a
Prelude.Nothing,
      $sel:version:DescribeWorldTemplateResponse' :: Maybe Text
version = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:DescribeWorldTemplateResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The Amazon Resource Name (ARN) of the world template.
describeWorldTemplateResponse_arn :: Lens.Lens' DescribeWorldTemplateResponse (Prelude.Maybe Prelude.Text)
describeWorldTemplateResponse_arn :: Lens' DescribeWorldTemplateResponse (Maybe Text)
describeWorldTemplateResponse_arn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeWorldTemplateResponse' {Maybe Text
arn :: Maybe Text
$sel:arn:DescribeWorldTemplateResponse' :: DescribeWorldTemplateResponse -> Maybe Text
arn} -> Maybe Text
arn) (\s :: DescribeWorldTemplateResponse
s@DescribeWorldTemplateResponse' {} Maybe Text
a -> DescribeWorldTemplateResponse
s {$sel:arn:DescribeWorldTemplateResponse' :: Maybe Text
arn = Maybe Text
a} :: DescribeWorldTemplateResponse)

-- | Unique, case-sensitive identifier that you provide to ensure the
-- idempotency of the request.
describeWorldTemplateResponse_clientRequestToken :: Lens.Lens' DescribeWorldTemplateResponse (Prelude.Maybe Prelude.Text)
describeWorldTemplateResponse_clientRequestToken :: Lens' DescribeWorldTemplateResponse (Maybe Text)
describeWorldTemplateResponse_clientRequestToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeWorldTemplateResponse' {Maybe Text
clientRequestToken :: Maybe Text
$sel:clientRequestToken:DescribeWorldTemplateResponse' :: DescribeWorldTemplateResponse -> Maybe Text
clientRequestToken} -> Maybe Text
clientRequestToken) (\s :: DescribeWorldTemplateResponse
s@DescribeWorldTemplateResponse' {} Maybe Text
a -> DescribeWorldTemplateResponse
s {$sel:clientRequestToken:DescribeWorldTemplateResponse' :: Maybe Text
clientRequestToken = Maybe Text
a} :: DescribeWorldTemplateResponse)

-- | The time, in milliseconds since the epoch, when the world template was
-- created.
describeWorldTemplateResponse_createdAt :: Lens.Lens' DescribeWorldTemplateResponse (Prelude.Maybe Prelude.UTCTime)
describeWorldTemplateResponse_createdAt :: Lens' DescribeWorldTemplateResponse (Maybe UTCTime)
describeWorldTemplateResponse_createdAt = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeWorldTemplateResponse' {Maybe POSIX
createdAt :: Maybe POSIX
$sel:createdAt:DescribeWorldTemplateResponse' :: DescribeWorldTemplateResponse -> Maybe POSIX
createdAt} -> Maybe POSIX
createdAt) (\s :: DescribeWorldTemplateResponse
s@DescribeWorldTemplateResponse' {} Maybe POSIX
a -> DescribeWorldTemplateResponse
s {$sel:createdAt:DescribeWorldTemplateResponse' :: Maybe POSIX
createdAt = Maybe POSIX
a} :: DescribeWorldTemplateResponse) 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 time, in milliseconds since the epoch, when the world template was
-- last updated.
describeWorldTemplateResponse_lastUpdatedAt :: Lens.Lens' DescribeWorldTemplateResponse (Prelude.Maybe Prelude.UTCTime)
describeWorldTemplateResponse_lastUpdatedAt :: Lens' DescribeWorldTemplateResponse (Maybe UTCTime)
describeWorldTemplateResponse_lastUpdatedAt = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeWorldTemplateResponse' {Maybe POSIX
lastUpdatedAt :: Maybe POSIX
$sel:lastUpdatedAt:DescribeWorldTemplateResponse' :: DescribeWorldTemplateResponse -> Maybe POSIX
lastUpdatedAt} -> Maybe POSIX
lastUpdatedAt) (\s :: DescribeWorldTemplateResponse
s@DescribeWorldTemplateResponse' {} Maybe POSIX
a -> DescribeWorldTemplateResponse
s {$sel:lastUpdatedAt:DescribeWorldTemplateResponse' :: Maybe POSIX
lastUpdatedAt = Maybe POSIX
a} :: DescribeWorldTemplateResponse) 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 name of the world template.
describeWorldTemplateResponse_name :: Lens.Lens' DescribeWorldTemplateResponse (Prelude.Maybe Prelude.Text)
describeWorldTemplateResponse_name :: Lens' DescribeWorldTemplateResponse (Maybe Text)
describeWorldTemplateResponse_name = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeWorldTemplateResponse' {Maybe Text
name :: Maybe Text
$sel:name:DescribeWorldTemplateResponse' :: DescribeWorldTemplateResponse -> Maybe Text
name} -> Maybe Text
name) (\s :: DescribeWorldTemplateResponse
s@DescribeWorldTemplateResponse' {} Maybe Text
a -> DescribeWorldTemplateResponse
s {$sel:name:DescribeWorldTemplateResponse' :: Maybe Text
name = Maybe Text
a} :: DescribeWorldTemplateResponse)

-- | A map that contains tag keys and tag values that are attached to the
-- world template.
describeWorldTemplateResponse_tags :: Lens.Lens' DescribeWorldTemplateResponse (Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text))
describeWorldTemplateResponse_tags :: Lens' DescribeWorldTemplateResponse (Maybe (HashMap Text Text))
describeWorldTemplateResponse_tags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeWorldTemplateResponse' {Maybe (HashMap Text Text)
tags :: Maybe (HashMap Text Text)
$sel:tags:DescribeWorldTemplateResponse' :: DescribeWorldTemplateResponse -> Maybe (HashMap Text Text)
tags} -> Maybe (HashMap Text Text)
tags) (\s :: DescribeWorldTemplateResponse
s@DescribeWorldTemplateResponse' {} Maybe (HashMap Text Text)
a -> DescribeWorldTemplateResponse
s {$sel:tags:DescribeWorldTemplateResponse' :: Maybe (HashMap Text Text)
tags = Maybe (HashMap Text Text)
a} :: DescribeWorldTemplateResponse) 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 version of the world template that you\'re using.
describeWorldTemplateResponse_version :: Lens.Lens' DescribeWorldTemplateResponse (Prelude.Maybe Prelude.Text)
describeWorldTemplateResponse_version :: Lens' DescribeWorldTemplateResponse (Maybe Text)
describeWorldTemplateResponse_version = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeWorldTemplateResponse' {Maybe Text
version :: Maybe Text
$sel:version:DescribeWorldTemplateResponse' :: DescribeWorldTemplateResponse -> Maybe Text
version} -> Maybe Text
version) (\s :: DescribeWorldTemplateResponse
s@DescribeWorldTemplateResponse' {} Maybe Text
a -> DescribeWorldTemplateResponse
s {$sel:version:DescribeWorldTemplateResponse' :: Maybe Text
version = Maybe Text
a} :: DescribeWorldTemplateResponse)

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

instance Prelude.NFData DescribeWorldTemplateResponse where
  rnf :: DescribeWorldTemplateResponse -> ()
rnf DescribeWorldTemplateResponse' {Int
Maybe Text
Maybe (HashMap Text Text)
Maybe POSIX
httpStatus :: Int
version :: Maybe Text
tags :: Maybe (HashMap Text Text)
name :: Maybe Text
lastUpdatedAt :: Maybe POSIX
createdAt :: Maybe POSIX
clientRequestToken :: Maybe Text
arn :: Maybe Text
$sel:httpStatus:DescribeWorldTemplateResponse' :: DescribeWorldTemplateResponse -> Int
$sel:version:DescribeWorldTemplateResponse' :: DescribeWorldTemplateResponse -> Maybe Text
$sel:tags:DescribeWorldTemplateResponse' :: DescribeWorldTemplateResponse -> Maybe (HashMap Text Text)
$sel:name:DescribeWorldTemplateResponse' :: DescribeWorldTemplateResponse -> Maybe Text
$sel:lastUpdatedAt:DescribeWorldTemplateResponse' :: DescribeWorldTemplateResponse -> Maybe POSIX
$sel:createdAt:DescribeWorldTemplateResponse' :: DescribeWorldTemplateResponse -> Maybe POSIX
$sel:clientRequestToken:DescribeWorldTemplateResponse' :: DescribeWorldTemplateResponse -> Maybe Text
$sel:arn:DescribeWorldTemplateResponse' :: DescribeWorldTemplateResponse -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
arn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
clientRequestToken
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
createdAt
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
lastUpdatedAt
      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 (HashMap Text Text)
tags
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
version
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus