{-# 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.DescribeRobotApplication
-- 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 robot application.
module Amazonka.RobOMaker.DescribeRobotApplication
  ( -- * Creating a Request
    DescribeRobotApplication (..),
    newDescribeRobotApplication,

    -- * Request Lenses
    describeRobotApplication_applicationVersion,
    describeRobotApplication_application,

    -- * Destructuring the Response
    DescribeRobotApplicationResponse (..),
    newDescribeRobotApplicationResponse,

    -- * Response Lenses
    describeRobotApplicationResponse_arn,
    describeRobotApplicationResponse_environment,
    describeRobotApplicationResponse_imageDigest,
    describeRobotApplicationResponse_lastUpdatedAt,
    describeRobotApplicationResponse_name,
    describeRobotApplicationResponse_revisionId,
    describeRobotApplicationResponse_robotSoftwareSuite,
    describeRobotApplicationResponse_sources,
    describeRobotApplicationResponse_tags,
    describeRobotApplicationResponse_version,
    describeRobotApplicationResponse_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:/ 'newDescribeRobotApplication' smart constructor.
data DescribeRobotApplication = DescribeRobotApplication'
  { -- | The version of the robot application to describe.
    DescribeRobotApplication -> Maybe Text
applicationVersion :: Prelude.Maybe Prelude.Text,
    -- | The Amazon Resource Name (ARN) of the robot application.
    DescribeRobotApplication -> Text
application :: Prelude.Text
  }
  deriving (DescribeRobotApplication -> DescribeRobotApplication -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeRobotApplication -> DescribeRobotApplication -> Bool
$c/= :: DescribeRobotApplication -> DescribeRobotApplication -> Bool
== :: DescribeRobotApplication -> DescribeRobotApplication -> Bool
$c== :: DescribeRobotApplication -> DescribeRobotApplication -> Bool
Prelude.Eq, ReadPrec [DescribeRobotApplication]
ReadPrec DescribeRobotApplication
Int -> ReadS DescribeRobotApplication
ReadS [DescribeRobotApplication]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeRobotApplication]
$creadListPrec :: ReadPrec [DescribeRobotApplication]
readPrec :: ReadPrec DescribeRobotApplication
$creadPrec :: ReadPrec DescribeRobotApplication
readList :: ReadS [DescribeRobotApplication]
$creadList :: ReadS [DescribeRobotApplication]
readsPrec :: Int -> ReadS DescribeRobotApplication
$creadsPrec :: Int -> ReadS DescribeRobotApplication
Prelude.Read, Int -> DescribeRobotApplication -> ShowS
[DescribeRobotApplication] -> ShowS
DescribeRobotApplication -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeRobotApplication] -> ShowS
$cshowList :: [DescribeRobotApplication] -> ShowS
show :: DescribeRobotApplication -> String
$cshow :: DescribeRobotApplication -> String
showsPrec :: Int -> DescribeRobotApplication -> ShowS
$cshowsPrec :: Int -> DescribeRobotApplication -> ShowS
Prelude.Show, forall x.
Rep DescribeRobotApplication x -> DescribeRobotApplication
forall x.
DescribeRobotApplication -> Rep DescribeRobotApplication x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DescribeRobotApplication x -> DescribeRobotApplication
$cfrom :: forall x.
DescribeRobotApplication -> Rep DescribeRobotApplication x
Prelude.Generic)

-- |
-- Create a value of 'DescribeRobotApplication' 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:
--
-- 'applicationVersion', 'describeRobotApplication_applicationVersion' - The version of the robot application to describe.
--
-- 'application', 'describeRobotApplication_application' - The Amazon Resource Name (ARN) of the robot application.
newDescribeRobotApplication ::
  -- | 'application'
  Prelude.Text ->
  DescribeRobotApplication
newDescribeRobotApplication :: Text -> DescribeRobotApplication
newDescribeRobotApplication Text
pApplication_ =
  DescribeRobotApplication'
    { $sel:applicationVersion:DescribeRobotApplication' :: Maybe Text
applicationVersion =
        forall a. Maybe a
Prelude.Nothing,
      $sel:application:DescribeRobotApplication' :: Text
application = Text
pApplication_
    }

-- | The version of the robot application to describe.
describeRobotApplication_applicationVersion :: Lens.Lens' DescribeRobotApplication (Prelude.Maybe Prelude.Text)
describeRobotApplication_applicationVersion :: Lens' DescribeRobotApplication (Maybe Text)
describeRobotApplication_applicationVersion = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeRobotApplication' {Maybe Text
applicationVersion :: Maybe Text
$sel:applicationVersion:DescribeRobotApplication' :: DescribeRobotApplication -> Maybe Text
applicationVersion} -> Maybe Text
applicationVersion) (\s :: DescribeRobotApplication
s@DescribeRobotApplication' {} Maybe Text
a -> DescribeRobotApplication
s {$sel:applicationVersion:DescribeRobotApplication' :: Maybe Text
applicationVersion = Maybe Text
a} :: DescribeRobotApplication)

-- | The Amazon Resource Name (ARN) of the robot application.
describeRobotApplication_application :: Lens.Lens' DescribeRobotApplication Prelude.Text
describeRobotApplication_application :: Lens' DescribeRobotApplication Text
describeRobotApplication_application = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeRobotApplication' {Text
application :: Text
$sel:application:DescribeRobotApplication' :: DescribeRobotApplication -> Text
application} -> Text
application) (\s :: DescribeRobotApplication
s@DescribeRobotApplication' {} Text
a -> DescribeRobotApplication
s {$sel:application:DescribeRobotApplication' :: Text
application = Text
a} :: DescribeRobotApplication)

instance Core.AWSRequest DescribeRobotApplication where
  type
    AWSResponse DescribeRobotApplication =
      DescribeRobotApplicationResponse
  request :: (Service -> Service)
-> DescribeRobotApplication -> Request DescribeRobotApplication
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 DescribeRobotApplication
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse DescribeRobotApplication)))
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 Environment
-> Maybe Text
-> Maybe POSIX
-> Maybe Text
-> Maybe Text
-> Maybe RobotSoftwareSuite
-> Maybe [Source]
-> Maybe (HashMap Text Text)
-> Maybe Text
-> Int
-> DescribeRobotApplicationResponse
DescribeRobotApplicationResponse'
            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
"environment")
            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
"imageDigest")
            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
"revisionId")
            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
"robotSoftwareSuite")
            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
"sources" 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
"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 DescribeRobotApplication where
  hashWithSalt :: Int -> DescribeRobotApplication -> Int
hashWithSalt Int
_salt DescribeRobotApplication' {Maybe Text
Text
application :: Text
applicationVersion :: Maybe Text
$sel:application:DescribeRobotApplication' :: DescribeRobotApplication -> Text
$sel:applicationVersion:DescribeRobotApplication' :: DescribeRobotApplication -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
applicationVersion
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
application

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

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

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

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

-- | /See:/ 'newDescribeRobotApplicationResponse' smart constructor.
data DescribeRobotApplicationResponse = DescribeRobotApplicationResponse'
  { -- | The Amazon Resource Name (ARN) of the robot application.
    DescribeRobotApplicationResponse -> Maybe Text
arn :: Prelude.Maybe Prelude.Text,
    -- | The object that contains the Docker image URI used to create the robot
    -- application.
    DescribeRobotApplicationResponse -> Maybe Environment
environment :: Prelude.Maybe Environment,
    -- | A SHA256 identifier for the Docker image that you use for your robot
    -- application.
    DescribeRobotApplicationResponse -> Maybe Text
imageDigest :: Prelude.Maybe Prelude.Text,
    -- | The time, in milliseconds since the epoch, when the robot application
    -- was last updated.
    DescribeRobotApplicationResponse -> Maybe POSIX
lastUpdatedAt :: Prelude.Maybe Data.POSIX,
    -- | The name of the robot application.
    DescribeRobotApplicationResponse -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
    -- | The revision id of the robot application.
    DescribeRobotApplicationResponse -> Maybe Text
revisionId :: Prelude.Maybe Prelude.Text,
    -- | The robot software suite (ROS distribution) used by the robot
    -- application.
    DescribeRobotApplicationResponse -> Maybe RobotSoftwareSuite
robotSoftwareSuite :: Prelude.Maybe RobotSoftwareSuite,
    -- | The sources of the robot application.
    DescribeRobotApplicationResponse -> Maybe [Source]
sources :: Prelude.Maybe [Source],
    -- | The list of all tags added to the specified robot application.
    DescribeRobotApplicationResponse -> Maybe (HashMap Text Text)
tags :: Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text),
    -- | The version of the robot application.
    DescribeRobotApplicationResponse -> Maybe Text
version :: Prelude.Maybe Prelude.Text,
    -- | The response's http status code.
    DescribeRobotApplicationResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (DescribeRobotApplicationResponse
-> DescribeRobotApplicationResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeRobotApplicationResponse
-> DescribeRobotApplicationResponse -> Bool
$c/= :: DescribeRobotApplicationResponse
-> DescribeRobotApplicationResponse -> Bool
== :: DescribeRobotApplicationResponse
-> DescribeRobotApplicationResponse -> Bool
$c== :: DescribeRobotApplicationResponse
-> DescribeRobotApplicationResponse -> Bool
Prelude.Eq, ReadPrec [DescribeRobotApplicationResponse]
ReadPrec DescribeRobotApplicationResponse
Int -> ReadS DescribeRobotApplicationResponse
ReadS [DescribeRobotApplicationResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeRobotApplicationResponse]
$creadListPrec :: ReadPrec [DescribeRobotApplicationResponse]
readPrec :: ReadPrec DescribeRobotApplicationResponse
$creadPrec :: ReadPrec DescribeRobotApplicationResponse
readList :: ReadS [DescribeRobotApplicationResponse]
$creadList :: ReadS [DescribeRobotApplicationResponse]
readsPrec :: Int -> ReadS DescribeRobotApplicationResponse
$creadsPrec :: Int -> ReadS DescribeRobotApplicationResponse
Prelude.Read, Int -> DescribeRobotApplicationResponse -> ShowS
[DescribeRobotApplicationResponse] -> ShowS
DescribeRobotApplicationResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeRobotApplicationResponse] -> ShowS
$cshowList :: [DescribeRobotApplicationResponse] -> ShowS
show :: DescribeRobotApplicationResponse -> String
$cshow :: DescribeRobotApplicationResponse -> String
showsPrec :: Int -> DescribeRobotApplicationResponse -> ShowS
$cshowsPrec :: Int -> DescribeRobotApplicationResponse -> ShowS
Prelude.Show, forall x.
Rep DescribeRobotApplicationResponse x
-> DescribeRobotApplicationResponse
forall x.
DescribeRobotApplicationResponse
-> Rep DescribeRobotApplicationResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DescribeRobotApplicationResponse x
-> DescribeRobotApplicationResponse
$cfrom :: forall x.
DescribeRobotApplicationResponse
-> Rep DescribeRobotApplicationResponse x
Prelude.Generic)

-- |
-- Create a value of 'DescribeRobotApplicationResponse' 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', 'describeRobotApplicationResponse_arn' - The Amazon Resource Name (ARN) of the robot application.
--
-- 'environment', 'describeRobotApplicationResponse_environment' - The object that contains the Docker image URI used to create the robot
-- application.
--
-- 'imageDigest', 'describeRobotApplicationResponse_imageDigest' - A SHA256 identifier for the Docker image that you use for your robot
-- application.
--
-- 'lastUpdatedAt', 'describeRobotApplicationResponse_lastUpdatedAt' - The time, in milliseconds since the epoch, when the robot application
-- was last updated.
--
-- 'name', 'describeRobotApplicationResponse_name' - The name of the robot application.
--
-- 'revisionId', 'describeRobotApplicationResponse_revisionId' - The revision id of the robot application.
--
-- 'robotSoftwareSuite', 'describeRobotApplicationResponse_robotSoftwareSuite' - The robot software suite (ROS distribution) used by the robot
-- application.
--
-- 'sources', 'describeRobotApplicationResponse_sources' - The sources of the robot application.
--
-- 'tags', 'describeRobotApplicationResponse_tags' - The list of all tags added to the specified robot application.
--
-- 'version', 'describeRobotApplicationResponse_version' - The version of the robot application.
--
-- 'httpStatus', 'describeRobotApplicationResponse_httpStatus' - The response's http status code.
newDescribeRobotApplicationResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  DescribeRobotApplicationResponse
newDescribeRobotApplicationResponse :: Int -> DescribeRobotApplicationResponse
newDescribeRobotApplicationResponse Int
pHttpStatus_ =
  DescribeRobotApplicationResponse'
    { $sel:arn:DescribeRobotApplicationResponse' :: Maybe Text
arn =
        forall a. Maybe a
Prelude.Nothing,
      $sel:environment:DescribeRobotApplicationResponse' :: Maybe Environment
environment = forall a. Maybe a
Prelude.Nothing,
      $sel:imageDigest:DescribeRobotApplicationResponse' :: Maybe Text
imageDigest = forall a. Maybe a
Prelude.Nothing,
      $sel:lastUpdatedAt:DescribeRobotApplicationResponse' :: Maybe POSIX
lastUpdatedAt = forall a. Maybe a
Prelude.Nothing,
      $sel:name:DescribeRobotApplicationResponse' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:revisionId:DescribeRobotApplicationResponse' :: Maybe Text
revisionId = forall a. Maybe a
Prelude.Nothing,
      $sel:robotSoftwareSuite:DescribeRobotApplicationResponse' :: Maybe RobotSoftwareSuite
robotSoftwareSuite = forall a. Maybe a
Prelude.Nothing,
      $sel:sources:DescribeRobotApplicationResponse' :: Maybe [Source]
sources = forall a. Maybe a
Prelude.Nothing,
      $sel:tags:DescribeRobotApplicationResponse' :: Maybe (HashMap Text Text)
tags = forall a. Maybe a
Prelude.Nothing,
      $sel:version:DescribeRobotApplicationResponse' :: Maybe Text
version = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:DescribeRobotApplicationResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

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

-- | The object that contains the Docker image URI used to create the robot
-- application.
describeRobotApplicationResponse_environment :: Lens.Lens' DescribeRobotApplicationResponse (Prelude.Maybe Environment)
describeRobotApplicationResponse_environment :: Lens' DescribeRobotApplicationResponse (Maybe Environment)
describeRobotApplicationResponse_environment = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeRobotApplicationResponse' {Maybe Environment
environment :: Maybe Environment
$sel:environment:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe Environment
environment} -> Maybe Environment
environment) (\s :: DescribeRobotApplicationResponse
s@DescribeRobotApplicationResponse' {} Maybe Environment
a -> DescribeRobotApplicationResponse
s {$sel:environment:DescribeRobotApplicationResponse' :: Maybe Environment
environment = Maybe Environment
a} :: DescribeRobotApplicationResponse)

-- | A SHA256 identifier for the Docker image that you use for your robot
-- application.
describeRobotApplicationResponse_imageDigest :: Lens.Lens' DescribeRobotApplicationResponse (Prelude.Maybe Prelude.Text)
describeRobotApplicationResponse_imageDigest :: Lens' DescribeRobotApplicationResponse (Maybe Text)
describeRobotApplicationResponse_imageDigest = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeRobotApplicationResponse' {Maybe Text
imageDigest :: Maybe Text
$sel:imageDigest:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe Text
imageDigest} -> Maybe Text
imageDigest) (\s :: DescribeRobotApplicationResponse
s@DescribeRobotApplicationResponse' {} Maybe Text
a -> DescribeRobotApplicationResponse
s {$sel:imageDigest:DescribeRobotApplicationResponse' :: Maybe Text
imageDigest = Maybe Text
a} :: DescribeRobotApplicationResponse)

-- | The time, in milliseconds since the epoch, when the robot application
-- was last updated.
describeRobotApplicationResponse_lastUpdatedAt :: Lens.Lens' DescribeRobotApplicationResponse (Prelude.Maybe Prelude.UTCTime)
describeRobotApplicationResponse_lastUpdatedAt :: Lens' DescribeRobotApplicationResponse (Maybe UTCTime)
describeRobotApplicationResponse_lastUpdatedAt = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeRobotApplicationResponse' {Maybe POSIX
lastUpdatedAt :: Maybe POSIX
$sel:lastUpdatedAt:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe POSIX
lastUpdatedAt} -> Maybe POSIX
lastUpdatedAt) (\s :: DescribeRobotApplicationResponse
s@DescribeRobotApplicationResponse' {} Maybe POSIX
a -> DescribeRobotApplicationResponse
s {$sel:lastUpdatedAt:DescribeRobotApplicationResponse' :: Maybe POSIX
lastUpdatedAt = Maybe POSIX
a} :: DescribeRobotApplicationResponse) 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 robot application.
describeRobotApplicationResponse_name :: Lens.Lens' DescribeRobotApplicationResponse (Prelude.Maybe Prelude.Text)
describeRobotApplicationResponse_name :: Lens' DescribeRobotApplicationResponse (Maybe Text)
describeRobotApplicationResponse_name = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeRobotApplicationResponse' {Maybe Text
name :: Maybe Text
$sel:name:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe Text
name} -> Maybe Text
name) (\s :: DescribeRobotApplicationResponse
s@DescribeRobotApplicationResponse' {} Maybe Text
a -> DescribeRobotApplicationResponse
s {$sel:name:DescribeRobotApplicationResponse' :: Maybe Text
name = Maybe Text
a} :: DescribeRobotApplicationResponse)

-- | The revision id of the robot application.
describeRobotApplicationResponse_revisionId :: Lens.Lens' DescribeRobotApplicationResponse (Prelude.Maybe Prelude.Text)
describeRobotApplicationResponse_revisionId :: Lens' DescribeRobotApplicationResponse (Maybe Text)
describeRobotApplicationResponse_revisionId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeRobotApplicationResponse' {Maybe Text
revisionId :: Maybe Text
$sel:revisionId:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe Text
revisionId} -> Maybe Text
revisionId) (\s :: DescribeRobotApplicationResponse
s@DescribeRobotApplicationResponse' {} Maybe Text
a -> DescribeRobotApplicationResponse
s {$sel:revisionId:DescribeRobotApplicationResponse' :: Maybe Text
revisionId = Maybe Text
a} :: DescribeRobotApplicationResponse)

-- | The robot software suite (ROS distribution) used by the robot
-- application.
describeRobotApplicationResponse_robotSoftwareSuite :: Lens.Lens' DescribeRobotApplicationResponse (Prelude.Maybe RobotSoftwareSuite)
describeRobotApplicationResponse_robotSoftwareSuite :: Lens' DescribeRobotApplicationResponse (Maybe RobotSoftwareSuite)
describeRobotApplicationResponse_robotSoftwareSuite = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeRobotApplicationResponse' {Maybe RobotSoftwareSuite
robotSoftwareSuite :: Maybe RobotSoftwareSuite
$sel:robotSoftwareSuite:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe RobotSoftwareSuite
robotSoftwareSuite} -> Maybe RobotSoftwareSuite
robotSoftwareSuite) (\s :: DescribeRobotApplicationResponse
s@DescribeRobotApplicationResponse' {} Maybe RobotSoftwareSuite
a -> DescribeRobotApplicationResponse
s {$sel:robotSoftwareSuite:DescribeRobotApplicationResponse' :: Maybe RobotSoftwareSuite
robotSoftwareSuite = Maybe RobotSoftwareSuite
a} :: DescribeRobotApplicationResponse)

-- | The sources of the robot application.
describeRobotApplicationResponse_sources :: Lens.Lens' DescribeRobotApplicationResponse (Prelude.Maybe [Source])
describeRobotApplicationResponse_sources :: Lens' DescribeRobotApplicationResponse (Maybe [Source])
describeRobotApplicationResponse_sources = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeRobotApplicationResponse' {Maybe [Source]
sources :: Maybe [Source]
$sel:sources:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe [Source]
sources} -> Maybe [Source]
sources) (\s :: DescribeRobotApplicationResponse
s@DescribeRobotApplicationResponse' {} Maybe [Source]
a -> DescribeRobotApplicationResponse
s {$sel:sources:DescribeRobotApplicationResponse' :: Maybe [Source]
sources = Maybe [Source]
a} :: DescribeRobotApplicationResponse) 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 list of all tags added to the specified robot application.
describeRobotApplicationResponse_tags :: Lens.Lens' DescribeRobotApplicationResponse (Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text))
describeRobotApplicationResponse_tags :: Lens' DescribeRobotApplicationResponse (Maybe (HashMap Text Text))
describeRobotApplicationResponse_tags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeRobotApplicationResponse' {Maybe (HashMap Text Text)
tags :: Maybe (HashMap Text Text)
$sel:tags:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe (HashMap Text Text)
tags} -> Maybe (HashMap Text Text)
tags) (\s :: DescribeRobotApplicationResponse
s@DescribeRobotApplicationResponse' {} Maybe (HashMap Text Text)
a -> DescribeRobotApplicationResponse
s {$sel:tags:DescribeRobotApplicationResponse' :: Maybe (HashMap Text Text)
tags = Maybe (HashMap Text Text)
a} :: DescribeRobotApplicationResponse) 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 robot application.
describeRobotApplicationResponse_version :: Lens.Lens' DescribeRobotApplicationResponse (Prelude.Maybe Prelude.Text)
describeRobotApplicationResponse_version :: Lens' DescribeRobotApplicationResponse (Maybe Text)
describeRobotApplicationResponse_version = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeRobotApplicationResponse' {Maybe Text
version :: Maybe Text
$sel:version:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe Text
version} -> Maybe Text
version) (\s :: DescribeRobotApplicationResponse
s@DescribeRobotApplicationResponse' {} Maybe Text
a -> DescribeRobotApplicationResponse
s {$sel:version:DescribeRobotApplicationResponse' :: Maybe Text
version = Maybe Text
a} :: DescribeRobotApplicationResponse)

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

instance
  Prelude.NFData
    DescribeRobotApplicationResponse
  where
  rnf :: DescribeRobotApplicationResponse -> ()
rnf DescribeRobotApplicationResponse' {Int
Maybe [Source]
Maybe Text
Maybe (HashMap Text Text)
Maybe POSIX
Maybe Environment
Maybe RobotSoftwareSuite
httpStatus :: Int
version :: Maybe Text
tags :: Maybe (HashMap Text Text)
sources :: Maybe [Source]
robotSoftwareSuite :: Maybe RobotSoftwareSuite
revisionId :: Maybe Text
name :: Maybe Text
lastUpdatedAt :: Maybe POSIX
imageDigest :: Maybe Text
environment :: Maybe Environment
arn :: Maybe Text
$sel:httpStatus:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Int
$sel:version:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe Text
$sel:tags:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe (HashMap Text Text)
$sel:sources:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe [Source]
$sel:robotSoftwareSuite:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe RobotSoftwareSuite
$sel:revisionId:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe Text
$sel:name:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe Text
$sel:lastUpdatedAt:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe POSIX
$sel:imageDigest:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe Text
$sel:environment:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> Maybe Environment
$sel:arn:DescribeRobotApplicationResponse' :: DescribeRobotApplicationResponse -> 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 Environment
environment
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
imageDigest
      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 Text
revisionId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe RobotSoftwareSuite
robotSoftwareSuite
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Source]
sources
      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