{-# 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.SimSpaceWeaver.DescribeApp
-- 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 the state of the given custom app.
module Amazonka.SimSpaceWeaver.DescribeApp
  ( -- * Creating a Request
    DescribeApp (..),
    newDescribeApp,

    -- * Request Lenses
    describeApp_app,
    describeApp_domain,
    describeApp_simulation,

    -- * Destructuring the Response
    DescribeAppResponse (..),
    newDescribeAppResponse,

    -- * Response Lenses
    describeAppResponse_description,
    describeAppResponse_domain,
    describeAppResponse_endpointInfo,
    describeAppResponse_launchOverrides,
    describeAppResponse_name,
    describeAppResponse_simulation,
    describeAppResponse_status,
    describeAppResponse_targetStatus,
    describeAppResponse_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.SimSpaceWeaver.Types

-- | /See:/ 'newDescribeApp' smart constructor.
data DescribeApp = DescribeApp'
  { -- | The name of the app.
    DescribeApp -> Text
app :: Prelude.Text,
    -- | The name of the domain of the app.
    DescribeApp -> Text
domain :: Prelude.Text,
    -- | The name of the simulation of the app.
    DescribeApp -> Text
simulation :: Prelude.Text
  }
  deriving (DescribeApp -> DescribeApp -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeApp -> DescribeApp -> Bool
$c/= :: DescribeApp -> DescribeApp -> Bool
== :: DescribeApp -> DescribeApp -> Bool
$c== :: DescribeApp -> DescribeApp -> Bool
Prelude.Eq, ReadPrec [DescribeApp]
ReadPrec DescribeApp
Int -> ReadS DescribeApp
ReadS [DescribeApp]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeApp]
$creadListPrec :: ReadPrec [DescribeApp]
readPrec :: ReadPrec DescribeApp
$creadPrec :: ReadPrec DescribeApp
readList :: ReadS [DescribeApp]
$creadList :: ReadS [DescribeApp]
readsPrec :: Int -> ReadS DescribeApp
$creadsPrec :: Int -> ReadS DescribeApp
Prelude.Read, Int -> DescribeApp -> ShowS
[DescribeApp] -> ShowS
DescribeApp -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeApp] -> ShowS
$cshowList :: [DescribeApp] -> ShowS
show :: DescribeApp -> String
$cshow :: DescribeApp -> String
showsPrec :: Int -> DescribeApp -> ShowS
$cshowsPrec :: Int -> DescribeApp -> ShowS
Prelude.Show, forall x. Rep DescribeApp x -> DescribeApp
forall x. DescribeApp -> Rep DescribeApp x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DescribeApp x -> DescribeApp
$cfrom :: forall x. DescribeApp -> Rep DescribeApp x
Prelude.Generic)

-- |
-- Create a value of 'DescribeApp' 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:
--
-- 'app', 'describeApp_app' - The name of the app.
--
-- 'domain', 'describeApp_domain' - The name of the domain of the app.
--
-- 'simulation', 'describeApp_simulation' - The name of the simulation of the app.
newDescribeApp ::
  -- | 'app'
  Prelude.Text ->
  -- | 'domain'
  Prelude.Text ->
  -- | 'simulation'
  Prelude.Text ->
  DescribeApp
newDescribeApp :: Text -> Text -> Text -> DescribeApp
newDescribeApp Text
pApp_ Text
pDomain_ Text
pSimulation_ =
  DescribeApp'
    { $sel:app:DescribeApp' :: Text
app = Text
pApp_,
      $sel:domain:DescribeApp' :: Text
domain = Text
pDomain_,
      $sel:simulation:DescribeApp' :: Text
simulation = Text
pSimulation_
    }

-- | The name of the app.
describeApp_app :: Lens.Lens' DescribeApp Prelude.Text
describeApp_app :: Lens' DescribeApp Text
describeApp_app = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeApp' {Text
app :: Text
$sel:app:DescribeApp' :: DescribeApp -> Text
app} -> Text
app) (\s :: DescribeApp
s@DescribeApp' {} Text
a -> DescribeApp
s {$sel:app:DescribeApp' :: Text
app = Text
a} :: DescribeApp)

-- | The name of the domain of the app.
describeApp_domain :: Lens.Lens' DescribeApp Prelude.Text
describeApp_domain :: Lens' DescribeApp Text
describeApp_domain = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeApp' {Text
domain :: Text
$sel:domain:DescribeApp' :: DescribeApp -> Text
domain} -> Text
domain) (\s :: DescribeApp
s@DescribeApp' {} Text
a -> DescribeApp
s {$sel:domain:DescribeApp' :: Text
domain = Text
a} :: DescribeApp)

-- | The name of the simulation of the app.
describeApp_simulation :: Lens.Lens' DescribeApp Prelude.Text
describeApp_simulation :: Lens' DescribeApp Text
describeApp_simulation = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeApp' {Text
simulation :: Text
$sel:simulation:DescribeApp' :: DescribeApp -> Text
simulation} -> Text
simulation) (\s :: DescribeApp
s@DescribeApp' {} Text
a -> DescribeApp
s {$sel:simulation:DescribeApp' :: Text
simulation = Text
a} :: DescribeApp)

instance Core.AWSRequest DescribeApp where
  type AWSResponse DescribeApp = DescribeAppResponse
  request :: (Service -> Service) -> DescribeApp -> Request DescribeApp
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 DescribeApp
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse DescribeApp)))
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 SimulationAppEndpointInfo
-> Maybe LaunchOverrides
-> Maybe Text
-> Maybe Text
-> Maybe SimulationAppStatus
-> Maybe SimulationAppTargetStatus
-> Int
-> DescribeAppResponse
DescribeAppResponse'
            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
"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
"Domain")
            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
"EndpointInfo")
            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
"LaunchOverrides")
            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
"Simulation")
            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
"Status")
            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
"TargetStatus")
            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 DescribeApp where
  hashWithSalt :: Int -> DescribeApp -> Int
hashWithSalt Int
_salt DescribeApp' {Text
simulation :: Text
domain :: Text
app :: Text
$sel:simulation:DescribeApp' :: DescribeApp -> Text
$sel:domain:DescribeApp' :: DescribeApp -> Text
$sel:app:DescribeApp' :: DescribeApp -> Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
app
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
domain
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
simulation

instance Prelude.NFData DescribeApp where
  rnf :: DescribeApp -> ()
rnf DescribeApp' {Text
simulation :: Text
domain :: Text
app :: Text
$sel:simulation:DescribeApp' :: DescribeApp -> Text
$sel:domain:DescribeApp' :: DescribeApp -> Text
$sel:app:DescribeApp' :: DescribeApp -> Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Text
app
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
domain
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
simulation

instance Data.ToHeaders DescribeApp where
  toHeaders :: DescribeApp -> 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 DescribeApp where
  toPath :: DescribeApp -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/describeapp"

instance Data.ToQuery DescribeApp where
  toQuery :: DescribeApp -> QueryString
toQuery DescribeApp' {Text
simulation :: Text
domain :: Text
app :: Text
$sel:simulation:DescribeApp' :: DescribeApp -> Text
$sel:domain:DescribeApp' :: DescribeApp -> Text
$sel:app:DescribeApp' :: DescribeApp -> Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"app" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Text
app,
        ByteString
"domain" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Text
domain,
        ByteString
"simulation" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Text
simulation
      ]

-- | /See:/ 'newDescribeAppResponse' smart constructor.
data DescribeAppResponse = DescribeAppResponse'
  { -- | The description of the app.
    DescribeAppResponse -> Maybe Text
description :: Prelude.Maybe Prelude.Text,
    -- | The name of the domain of the app.
    DescribeAppResponse -> Maybe Text
domain :: Prelude.Maybe Prelude.Text,
    -- | Information about the network endpoint for the custom app. You can use
    -- the endpoint to connect to the custom app.
    DescribeAppResponse -> Maybe SimulationAppEndpointInfo
endpointInfo :: Prelude.Maybe SimulationAppEndpointInfo,
    DescribeAppResponse -> Maybe LaunchOverrides
launchOverrides :: Prelude.Maybe LaunchOverrides,
    -- | The name of the app.
    DescribeAppResponse -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
    -- | The name of the simulation of the app.
    DescribeAppResponse -> Maybe Text
simulation :: Prelude.Maybe Prelude.Text,
    -- | The current lifecycle state of the custom app.
    DescribeAppResponse -> Maybe SimulationAppStatus
status :: Prelude.Maybe SimulationAppStatus,
    -- | The desired lifecycle state of the custom app.
    DescribeAppResponse -> Maybe SimulationAppTargetStatus
targetStatus :: Prelude.Maybe SimulationAppTargetStatus,
    -- | The response's http status code.
    DescribeAppResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (DescribeAppResponse -> DescribeAppResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeAppResponse -> DescribeAppResponse -> Bool
$c/= :: DescribeAppResponse -> DescribeAppResponse -> Bool
== :: DescribeAppResponse -> DescribeAppResponse -> Bool
$c== :: DescribeAppResponse -> DescribeAppResponse -> Bool
Prelude.Eq, ReadPrec [DescribeAppResponse]
ReadPrec DescribeAppResponse
Int -> ReadS DescribeAppResponse
ReadS [DescribeAppResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeAppResponse]
$creadListPrec :: ReadPrec [DescribeAppResponse]
readPrec :: ReadPrec DescribeAppResponse
$creadPrec :: ReadPrec DescribeAppResponse
readList :: ReadS [DescribeAppResponse]
$creadList :: ReadS [DescribeAppResponse]
readsPrec :: Int -> ReadS DescribeAppResponse
$creadsPrec :: Int -> ReadS DescribeAppResponse
Prelude.Read, Int -> DescribeAppResponse -> ShowS
[DescribeAppResponse] -> ShowS
DescribeAppResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeAppResponse] -> ShowS
$cshowList :: [DescribeAppResponse] -> ShowS
show :: DescribeAppResponse -> String
$cshow :: DescribeAppResponse -> String
showsPrec :: Int -> DescribeAppResponse -> ShowS
$cshowsPrec :: Int -> DescribeAppResponse -> ShowS
Prelude.Show, forall x. Rep DescribeAppResponse x -> DescribeAppResponse
forall x. DescribeAppResponse -> Rep DescribeAppResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DescribeAppResponse x -> DescribeAppResponse
$cfrom :: forall x. DescribeAppResponse -> Rep DescribeAppResponse x
Prelude.Generic)

-- |
-- Create a value of 'DescribeAppResponse' 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:
--
-- 'description', 'describeAppResponse_description' - The description of the app.
--
-- 'domain', 'describeAppResponse_domain' - The name of the domain of the app.
--
-- 'endpointInfo', 'describeAppResponse_endpointInfo' - Information about the network endpoint for the custom app. You can use
-- the endpoint to connect to the custom app.
--
-- 'launchOverrides', 'describeAppResponse_launchOverrides' - Undocumented member.
--
-- 'name', 'describeAppResponse_name' - The name of the app.
--
-- 'simulation', 'describeAppResponse_simulation' - The name of the simulation of the app.
--
-- 'status', 'describeAppResponse_status' - The current lifecycle state of the custom app.
--
-- 'targetStatus', 'describeAppResponse_targetStatus' - The desired lifecycle state of the custom app.
--
-- 'httpStatus', 'describeAppResponse_httpStatus' - The response's http status code.
newDescribeAppResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  DescribeAppResponse
newDescribeAppResponse :: Int -> DescribeAppResponse
newDescribeAppResponse Int
pHttpStatus_ =
  DescribeAppResponse'
    { $sel:description:DescribeAppResponse' :: Maybe Text
description = forall a. Maybe a
Prelude.Nothing,
      $sel:domain:DescribeAppResponse' :: Maybe Text
domain = forall a. Maybe a
Prelude.Nothing,
      $sel:endpointInfo:DescribeAppResponse' :: Maybe SimulationAppEndpointInfo
endpointInfo = forall a. Maybe a
Prelude.Nothing,
      $sel:launchOverrides:DescribeAppResponse' :: Maybe LaunchOverrides
launchOverrides = forall a. Maybe a
Prelude.Nothing,
      $sel:name:DescribeAppResponse' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:simulation:DescribeAppResponse' :: Maybe Text
simulation = forall a. Maybe a
Prelude.Nothing,
      $sel:status:DescribeAppResponse' :: Maybe SimulationAppStatus
status = forall a. Maybe a
Prelude.Nothing,
      $sel:targetStatus:DescribeAppResponse' :: Maybe SimulationAppTargetStatus
targetStatus = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:DescribeAppResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The description of the app.
describeAppResponse_description :: Lens.Lens' DescribeAppResponse (Prelude.Maybe Prelude.Text)
describeAppResponse_description :: Lens' DescribeAppResponse (Maybe Text)
describeAppResponse_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeAppResponse' {Maybe Text
description :: Maybe Text
$sel:description:DescribeAppResponse' :: DescribeAppResponse -> Maybe Text
description} -> Maybe Text
description) (\s :: DescribeAppResponse
s@DescribeAppResponse' {} Maybe Text
a -> DescribeAppResponse
s {$sel:description:DescribeAppResponse' :: Maybe Text
description = Maybe Text
a} :: DescribeAppResponse)

-- | The name of the domain of the app.
describeAppResponse_domain :: Lens.Lens' DescribeAppResponse (Prelude.Maybe Prelude.Text)
describeAppResponse_domain :: Lens' DescribeAppResponse (Maybe Text)
describeAppResponse_domain = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeAppResponse' {Maybe Text
domain :: Maybe Text
$sel:domain:DescribeAppResponse' :: DescribeAppResponse -> Maybe Text
domain} -> Maybe Text
domain) (\s :: DescribeAppResponse
s@DescribeAppResponse' {} Maybe Text
a -> DescribeAppResponse
s {$sel:domain:DescribeAppResponse' :: Maybe Text
domain = Maybe Text
a} :: DescribeAppResponse)

-- | Information about the network endpoint for the custom app. You can use
-- the endpoint to connect to the custom app.
describeAppResponse_endpointInfo :: Lens.Lens' DescribeAppResponse (Prelude.Maybe SimulationAppEndpointInfo)
describeAppResponse_endpointInfo :: Lens' DescribeAppResponse (Maybe SimulationAppEndpointInfo)
describeAppResponse_endpointInfo = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeAppResponse' {Maybe SimulationAppEndpointInfo
endpointInfo :: Maybe SimulationAppEndpointInfo
$sel:endpointInfo:DescribeAppResponse' :: DescribeAppResponse -> Maybe SimulationAppEndpointInfo
endpointInfo} -> Maybe SimulationAppEndpointInfo
endpointInfo) (\s :: DescribeAppResponse
s@DescribeAppResponse' {} Maybe SimulationAppEndpointInfo
a -> DescribeAppResponse
s {$sel:endpointInfo:DescribeAppResponse' :: Maybe SimulationAppEndpointInfo
endpointInfo = Maybe SimulationAppEndpointInfo
a} :: DescribeAppResponse)

-- | Undocumented member.
describeAppResponse_launchOverrides :: Lens.Lens' DescribeAppResponse (Prelude.Maybe LaunchOverrides)
describeAppResponse_launchOverrides :: Lens' DescribeAppResponse (Maybe LaunchOverrides)
describeAppResponse_launchOverrides = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeAppResponse' {Maybe LaunchOverrides
launchOverrides :: Maybe LaunchOverrides
$sel:launchOverrides:DescribeAppResponse' :: DescribeAppResponse -> Maybe LaunchOverrides
launchOverrides} -> Maybe LaunchOverrides
launchOverrides) (\s :: DescribeAppResponse
s@DescribeAppResponse' {} Maybe LaunchOverrides
a -> DescribeAppResponse
s {$sel:launchOverrides:DescribeAppResponse' :: Maybe LaunchOverrides
launchOverrides = Maybe LaunchOverrides
a} :: DescribeAppResponse)

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

-- | The name of the simulation of the app.
describeAppResponse_simulation :: Lens.Lens' DescribeAppResponse (Prelude.Maybe Prelude.Text)
describeAppResponse_simulation :: Lens' DescribeAppResponse (Maybe Text)
describeAppResponse_simulation = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeAppResponse' {Maybe Text
simulation :: Maybe Text
$sel:simulation:DescribeAppResponse' :: DescribeAppResponse -> Maybe Text
simulation} -> Maybe Text
simulation) (\s :: DescribeAppResponse
s@DescribeAppResponse' {} Maybe Text
a -> DescribeAppResponse
s {$sel:simulation:DescribeAppResponse' :: Maybe Text
simulation = Maybe Text
a} :: DescribeAppResponse)

-- | The current lifecycle state of the custom app.
describeAppResponse_status :: Lens.Lens' DescribeAppResponse (Prelude.Maybe SimulationAppStatus)
describeAppResponse_status :: Lens' DescribeAppResponse (Maybe SimulationAppStatus)
describeAppResponse_status = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeAppResponse' {Maybe SimulationAppStatus
status :: Maybe SimulationAppStatus
$sel:status:DescribeAppResponse' :: DescribeAppResponse -> Maybe SimulationAppStatus
status} -> Maybe SimulationAppStatus
status) (\s :: DescribeAppResponse
s@DescribeAppResponse' {} Maybe SimulationAppStatus
a -> DescribeAppResponse
s {$sel:status:DescribeAppResponse' :: Maybe SimulationAppStatus
status = Maybe SimulationAppStatus
a} :: DescribeAppResponse)

-- | The desired lifecycle state of the custom app.
describeAppResponse_targetStatus :: Lens.Lens' DescribeAppResponse (Prelude.Maybe SimulationAppTargetStatus)
describeAppResponse_targetStatus :: Lens' DescribeAppResponse (Maybe SimulationAppTargetStatus)
describeAppResponse_targetStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeAppResponse' {Maybe SimulationAppTargetStatus
targetStatus :: Maybe SimulationAppTargetStatus
$sel:targetStatus:DescribeAppResponse' :: DescribeAppResponse -> Maybe SimulationAppTargetStatus
targetStatus} -> Maybe SimulationAppTargetStatus
targetStatus) (\s :: DescribeAppResponse
s@DescribeAppResponse' {} Maybe SimulationAppTargetStatus
a -> DescribeAppResponse
s {$sel:targetStatus:DescribeAppResponse' :: Maybe SimulationAppTargetStatus
targetStatus = Maybe SimulationAppTargetStatus
a} :: DescribeAppResponse)

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

instance Prelude.NFData DescribeAppResponse where
  rnf :: DescribeAppResponse -> ()
rnf DescribeAppResponse' {Int
Maybe Text
Maybe LaunchOverrides
Maybe SimulationAppEndpointInfo
Maybe SimulationAppStatus
Maybe SimulationAppTargetStatus
httpStatus :: Int
targetStatus :: Maybe SimulationAppTargetStatus
status :: Maybe SimulationAppStatus
simulation :: Maybe Text
name :: Maybe Text
launchOverrides :: Maybe LaunchOverrides
endpointInfo :: Maybe SimulationAppEndpointInfo
domain :: Maybe Text
description :: Maybe Text
$sel:httpStatus:DescribeAppResponse' :: DescribeAppResponse -> Int
$sel:targetStatus:DescribeAppResponse' :: DescribeAppResponse -> Maybe SimulationAppTargetStatus
$sel:status:DescribeAppResponse' :: DescribeAppResponse -> Maybe SimulationAppStatus
$sel:simulation:DescribeAppResponse' :: DescribeAppResponse -> Maybe Text
$sel:name:DescribeAppResponse' :: DescribeAppResponse -> Maybe Text
$sel:launchOverrides:DescribeAppResponse' :: DescribeAppResponse -> Maybe LaunchOverrides
$sel:endpointInfo:DescribeAppResponse' :: DescribeAppResponse -> Maybe SimulationAppEndpointInfo
$sel:domain:DescribeAppResponse' :: DescribeAppResponse -> Maybe Text
$sel:description:DescribeAppResponse' :: DescribeAppResponse -> Maybe Text
..} =
    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 Text
domain
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe SimulationAppEndpointInfo
endpointInfo
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe LaunchOverrides
launchOverrides
      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
simulation
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe SimulationAppStatus
status
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe SimulationAppTargetStatus
targetStatus
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus