{-# 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.MigrationHubStrategy.GetApplicationComponentDetails
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Retrieves details about an application component.
module Amazonka.MigrationHubStrategy.GetApplicationComponentDetails
  ( -- * Creating a Request
    GetApplicationComponentDetails (..),
    newGetApplicationComponentDetails,

    -- * Request Lenses
    getApplicationComponentDetails_applicationComponentId,

    -- * Destructuring the Response
    GetApplicationComponentDetailsResponse (..),
    newGetApplicationComponentDetailsResponse,

    -- * Response Lenses
    getApplicationComponentDetailsResponse_applicationComponentDetail,
    getApplicationComponentDetailsResponse_associatedApplications,
    getApplicationComponentDetailsResponse_associatedServerIds,
    getApplicationComponentDetailsResponse_moreApplicationResource,
    getApplicationComponentDetailsResponse_httpStatus,
  )
where

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

-- | /See:/ 'newGetApplicationComponentDetails' smart constructor.
data GetApplicationComponentDetails = GetApplicationComponentDetails'
  { -- | The ID of the application component. The ID is unique within an AWS
    -- account.
    GetApplicationComponentDetails -> Text
applicationComponentId :: Prelude.Text
  }
  deriving (GetApplicationComponentDetails
-> GetApplicationComponentDetails -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetApplicationComponentDetails
-> GetApplicationComponentDetails -> Bool
$c/= :: GetApplicationComponentDetails
-> GetApplicationComponentDetails -> Bool
== :: GetApplicationComponentDetails
-> GetApplicationComponentDetails -> Bool
$c== :: GetApplicationComponentDetails
-> GetApplicationComponentDetails -> Bool
Prelude.Eq, ReadPrec [GetApplicationComponentDetails]
ReadPrec GetApplicationComponentDetails
Int -> ReadS GetApplicationComponentDetails
ReadS [GetApplicationComponentDetails]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetApplicationComponentDetails]
$creadListPrec :: ReadPrec [GetApplicationComponentDetails]
readPrec :: ReadPrec GetApplicationComponentDetails
$creadPrec :: ReadPrec GetApplicationComponentDetails
readList :: ReadS [GetApplicationComponentDetails]
$creadList :: ReadS [GetApplicationComponentDetails]
readsPrec :: Int -> ReadS GetApplicationComponentDetails
$creadsPrec :: Int -> ReadS GetApplicationComponentDetails
Prelude.Read, Int -> GetApplicationComponentDetails -> ShowS
[GetApplicationComponentDetails] -> ShowS
GetApplicationComponentDetails -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetApplicationComponentDetails] -> ShowS
$cshowList :: [GetApplicationComponentDetails] -> ShowS
show :: GetApplicationComponentDetails -> String
$cshow :: GetApplicationComponentDetails -> String
showsPrec :: Int -> GetApplicationComponentDetails -> ShowS
$cshowsPrec :: Int -> GetApplicationComponentDetails -> ShowS
Prelude.Show, forall x.
Rep GetApplicationComponentDetails x
-> GetApplicationComponentDetails
forall x.
GetApplicationComponentDetails
-> Rep GetApplicationComponentDetails x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep GetApplicationComponentDetails x
-> GetApplicationComponentDetails
$cfrom :: forall x.
GetApplicationComponentDetails
-> Rep GetApplicationComponentDetails x
Prelude.Generic)

-- |
-- Create a value of 'GetApplicationComponentDetails' 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:
--
-- 'applicationComponentId', 'getApplicationComponentDetails_applicationComponentId' - The ID of the application component. The ID is unique within an AWS
-- account.
newGetApplicationComponentDetails ::
  -- | 'applicationComponentId'
  Prelude.Text ->
  GetApplicationComponentDetails
newGetApplicationComponentDetails :: Text -> GetApplicationComponentDetails
newGetApplicationComponentDetails
  Text
pApplicationComponentId_ =
    GetApplicationComponentDetails'
      { $sel:applicationComponentId:GetApplicationComponentDetails' :: Text
applicationComponentId =
          Text
pApplicationComponentId_
      }

-- | The ID of the application component. The ID is unique within an AWS
-- account.
getApplicationComponentDetails_applicationComponentId :: Lens.Lens' GetApplicationComponentDetails Prelude.Text
getApplicationComponentDetails_applicationComponentId :: Lens' GetApplicationComponentDetails Text
getApplicationComponentDetails_applicationComponentId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetApplicationComponentDetails' {Text
applicationComponentId :: Text
$sel:applicationComponentId:GetApplicationComponentDetails' :: GetApplicationComponentDetails -> Text
applicationComponentId} -> Text
applicationComponentId) (\s :: GetApplicationComponentDetails
s@GetApplicationComponentDetails' {} Text
a -> GetApplicationComponentDetails
s {$sel:applicationComponentId:GetApplicationComponentDetails' :: Text
applicationComponentId = Text
a} :: GetApplicationComponentDetails)

instance
  Core.AWSRequest
    GetApplicationComponentDetails
  where
  type
    AWSResponse GetApplicationComponentDetails =
      GetApplicationComponentDetailsResponse
  request :: (Service -> Service)
-> GetApplicationComponentDetails
-> Request GetApplicationComponentDetails
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 GetApplicationComponentDetails
-> ClientResponse ClientBody
-> m (Either
        Error
        (ClientResponse (AWSResponse GetApplicationComponentDetails)))
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 ApplicationComponentDetail
-> Maybe [AssociatedApplication]
-> Maybe [Text]
-> Maybe Bool
-> Int
-> GetApplicationComponentDetailsResponse
GetApplicationComponentDetailsResponse'
            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
"applicationComponentDetail")
            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
"associatedApplications"
                            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
"associatedServerIds"
                            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
"moreApplicationResource")
            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
    GetApplicationComponentDetails
  where
  hashWithSalt :: Int -> GetApplicationComponentDetails -> Int
hashWithSalt
    Int
_salt
    GetApplicationComponentDetails' {Text
applicationComponentId :: Text
$sel:applicationComponentId:GetApplicationComponentDetails' :: GetApplicationComponentDetails -> Text
..} =
      Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
applicationComponentId

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

instance
  Data.ToHeaders
    GetApplicationComponentDetails
  where
  toHeaders :: GetApplicationComponentDetails -> 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 GetApplicationComponentDetails where
  toPath :: GetApplicationComponentDetails -> ByteString
toPath GetApplicationComponentDetails' {Text
applicationComponentId :: Text
$sel:applicationComponentId:GetApplicationComponentDetails' :: GetApplicationComponentDetails -> Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"/get-applicationcomponent-details/",
        forall a. ToByteString a => a -> ByteString
Data.toBS Text
applicationComponentId
      ]

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

-- | /See:/ 'newGetApplicationComponentDetailsResponse' smart constructor.
data GetApplicationComponentDetailsResponse = GetApplicationComponentDetailsResponse'
  { -- | Detailed information about an application component.
    GetApplicationComponentDetailsResponse
-> Maybe ApplicationComponentDetail
applicationComponentDetail :: Prelude.Maybe ApplicationComponentDetail,
    -- | The associated application group as defined in AWS Application Discovery
    -- Service.
    GetApplicationComponentDetailsResponse
-> Maybe [AssociatedApplication]
associatedApplications :: Prelude.Maybe [AssociatedApplication],
    -- | A list of the IDs of the servers on which the application component is
    -- running.
    GetApplicationComponentDetailsResponse -> Maybe [Text]
associatedServerIds :: Prelude.Maybe [Prelude.Text],
    -- | Set to true if the application component belongs to more than one
    -- application group.
    GetApplicationComponentDetailsResponse -> Maybe Bool
moreApplicationResource :: Prelude.Maybe Prelude.Bool,
    -- | The response's http status code.
    GetApplicationComponentDetailsResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (GetApplicationComponentDetailsResponse
-> GetApplicationComponentDetailsResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetApplicationComponentDetailsResponse
-> GetApplicationComponentDetailsResponse -> Bool
$c/= :: GetApplicationComponentDetailsResponse
-> GetApplicationComponentDetailsResponse -> Bool
== :: GetApplicationComponentDetailsResponse
-> GetApplicationComponentDetailsResponse -> Bool
$c== :: GetApplicationComponentDetailsResponse
-> GetApplicationComponentDetailsResponse -> Bool
Prelude.Eq, ReadPrec [GetApplicationComponentDetailsResponse]
ReadPrec GetApplicationComponentDetailsResponse
Int -> ReadS GetApplicationComponentDetailsResponse
ReadS [GetApplicationComponentDetailsResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetApplicationComponentDetailsResponse]
$creadListPrec :: ReadPrec [GetApplicationComponentDetailsResponse]
readPrec :: ReadPrec GetApplicationComponentDetailsResponse
$creadPrec :: ReadPrec GetApplicationComponentDetailsResponse
readList :: ReadS [GetApplicationComponentDetailsResponse]
$creadList :: ReadS [GetApplicationComponentDetailsResponse]
readsPrec :: Int -> ReadS GetApplicationComponentDetailsResponse
$creadsPrec :: Int -> ReadS GetApplicationComponentDetailsResponse
Prelude.Read, Int -> GetApplicationComponentDetailsResponse -> ShowS
[GetApplicationComponentDetailsResponse] -> ShowS
GetApplicationComponentDetailsResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetApplicationComponentDetailsResponse] -> ShowS
$cshowList :: [GetApplicationComponentDetailsResponse] -> ShowS
show :: GetApplicationComponentDetailsResponse -> String
$cshow :: GetApplicationComponentDetailsResponse -> String
showsPrec :: Int -> GetApplicationComponentDetailsResponse -> ShowS
$cshowsPrec :: Int -> GetApplicationComponentDetailsResponse -> ShowS
Prelude.Show, forall x.
Rep GetApplicationComponentDetailsResponse x
-> GetApplicationComponentDetailsResponse
forall x.
GetApplicationComponentDetailsResponse
-> Rep GetApplicationComponentDetailsResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep GetApplicationComponentDetailsResponse x
-> GetApplicationComponentDetailsResponse
$cfrom :: forall x.
GetApplicationComponentDetailsResponse
-> Rep GetApplicationComponentDetailsResponse x
Prelude.Generic)

-- |
-- Create a value of 'GetApplicationComponentDetailsResponse' 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:
--
-- 'applicationComponentDetail', 'getApplicationComponentDetailsResponse_applicationComponentDetail' - Detailed information about an application component.
--
-- 'associatedApplications', 'getApplicationComponentDetailsResponse_associatedApplications' - The associated application group as defined in AWS Application Discovery
-- Service.
--
-- 'associatedServerIds', 'getApplicationComponentDetailsResponse_associatedServerIds' - A list of the IDs of the servers on which the application component is
-- running.
--
-- 'moreApplicationResource', 'getApplicationComponentDetailsResponse_moreApplicationResource' - Set to true if the application component belongs to more than one
-- application group.
--
-- 'httpStatus', 'getApplicationComponentDetailsResponse_httpStatus' - The response's http status code.
newGetApplicationComponentDetailsResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  GetApplicationComponentDetailsResponse
newGetApplicationComponentDetailsResponse :: Int -> GetApplicationComponentDetailsResponse
newGetApplicationComponentDetailsResponse
  Int
pHttpStatus_ =
    GetApplicationComponentDetailsResponse'
      { $sel:applicationComponentDetail:GetApplicationComponentDetailsResponse' :: Maybe ApplicationComponentDetail
applicationComponentDetail =
          forall a. Maybe a
Prelude.Nothing,
        $sel:associatedApplications:GetApplicationComponentDetailsResponse' :: Maybe [AssociatedApplication]
associatedApplications =
          forall a. Maybe a
Prelude.Nothing,
        $sel:associatedServerIds:GetApplicationComponentDetailsResponse' :: Maybe [Text]
associatedServerIds =
          forall a. Maybe a
Prelude.Nothing,
        $sel:moreApplicationResource:GetApplicationComponentDetailsResponse' :: Maybe Bool
moreApplicationResource =
          forall a. Maybe a
Prelude.Nothing,
        $sel:httpStatus:GetApplicationComponentDetailsResponse' :: Int
httpStatus = Int
pHttpStatus_
      }

-- | Detailed information about an application component.
getApplicationComponentDetailsResponse_applicationComponentDetail :: Lens.Lens' GetApplicationComponentDetailsResponse (Prelude.Maybe ApplicationComponentDetail)
getApplicationComponentDetailsResponse_applicationComponentDetail :: Lens'
  GetApplicationComponentDetailsResponse
  (Maybe ApplicationComponentDetail)
getApplicationComponentDetailsResponse_applicationComponentDetail = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetApplicationComponentDetailsResponse' {Maybe ApplicationComponentDetail
applicationComponentDetail :: Maybe ApplicationComponentDetail
$sel:applicationComponentDetail:GetApplicationComponentDetailsResponse' :: GetApplicationComponentDetailsResponse
-> Maybe ApplicationComponentDetail
applicationComponentDetail} -> Maybe ApplicationComponentDetail
applicationComponentDetail) (\s :: GetApplicationComponentDetailsResponse
s@GetApplicationComponentDetailsResponse' {} Maybe ApplicationComponentDetail
a -> GetApplicationComponentDetailsResponse
s {$sel:applicationComponentDetail:GetApplicationComponentDetailsResponse' :: Maybe ApplicationComponentDetail
applicationComponentDetail = Maybe ApplicationComponentDetail
a} :: GetApplicationComponentDetailsResponse)

-- | The associated application group as defined in AWS Application Discovery
-- Service.
getApplicationComponentDetailsResponse_associatedApplications :: Lens.Lens' GetApplicationComponentDetailsResponse (Prelude.Maybe [AssociatedApplication])
getApplicationComponentDetailsResponse_associatedApplications :: Lens'
  GetApplicationComponentDetailsResponse
  (Maybe [AssociatedApplication])
getApplicationComponentDetailsResponse_associatedApplications = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetApplicationComponentDetailsResponse' {Maybe [AssociatedApplication]
associatedApplications :: Maybe [AssociatedApplication]
$sel:associatedApplications:GetApplicationComponentDetailsResponse' :: GetApplicationComponentDetailsResponse
-> Maybe [AssociatedApplication]
associatedApplications} -> Maybe [AssociatedApplication]
associatedApplications) (\s :: GetApplicationComponentDetailsResponse
s@GetApplicationComponentDetailsResponse' {} Maybe [AssociatedApplication]
a -> GetApplicationComponentDetailsResponse
s {$sel:associatedApplications:GetApplicationComponentDetailsResponse' :: Maybe [AssociatedApplication]
associatedApplications = Maybe [AssociatedApplication]
a} :: GetApplicationComponentDetailsResponse) 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

-- | A list of the IDs of the servers on which the application component is
-- running.
getApplicationComponentDetailsResponse_associatedServerIds :: Lens.Lens' GetApplicationComponentDetailsResponse (Prelude.Maybe [Prelude.Text])
getApplicationComponentDetailsResponse_associatedServerIds :: Lens' GetApplicationComponentDetailsResponse (Maybe [Text])
getApplicationComponentDetailsResponse_associatedServerIds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetApplicationComponentDetailsResponse' {Maybe [Text]
associatedServerIds :: Maybe [Text]
$sel:associatedServerIds:GetApplicationComponentDetailsResponse' :: GetApplicationComponentDetailsResponse -> Maybe [Text]
associatedServerIds} -> Maybe [Text]
associatedServerIds) (\s :: GetApplicationComponentDetailsResponse
s@GetApplicationComponentDetailsResponse' {} Maybe [Text]
a -> GetApplicationComponentDetailsResponse
s {$sel:associatedServerIds:GetApplicationComponentDetailsResponse' :: Maybe [Text]
associatedServerIds = Maybe [Text]
a} :: GetApplicationComponentDetailsResponse) 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

-- | Set to true if the application component belongs to more than one
-- application group.
getApplicationComponentDetailsResponse_moreApplicationResource :: Lens.Lens' GetApplicationComponentDetailsResponse (Prelude.Maybe Prelude.Bool)
getApplicationComponentDetailsResponse_moreApplicationResource :: Lens' GetApplicationComponentDetailsResponse (Maybe Bool)
getApplicationComponentDetailsResponse_moreApplicationResource = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetApplicationComponentDetailsResponse' {Maybe Bool
moreApplicationResource :: Maybe Bool
$sel:moreApplicationResource:GetApplicationComponentDetailsResponse' :: GetApplicationComponentDetailsResponse -> Maybe Bool
moreApplicationResource} -> Maybe Bool
moreApplicationResource) (\s :: GetApplicationComponentDetailsResponse
s@GetApplicationComponentDetailsResponse' {} Maybe Bool
a -> GetApplicationComponentDetailsResponse
s {$sel:moreApplicationResource:GetApplicationComponentDetailsResponse' :: Maybe Bool
moreApplicationResource = Maybe Bool
a} :: GetApplicationComponentDetailsResponse)

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

instance
  Prelude.NFData
    GetApplicationComponentDetailsResponse
  where
  rnf :: GetApplicationComponentDetailsResponse -> ()
rnf GetApplicationComponentDetailsResponse' {Int
Maybe Bool
Maybe [Text]
Maybe [AssociatedApplication]
Maybe ApplicationComponentDetail
httpStatus :: Int
moreApplicationResource :: Maybe Bool
associatedServerIds :: Maybe [Text]
associatedApplications :: Maybe [AssociatedApplication]
applicationComponentDetail :: Maybe ApplicationComponentDetail
$sel:httpStatus:GetApplicationComponentDetailsResponse' :: GetApplicationComponentDetailsResponse -> Int
$sel:moreApplicationResource:GetApplicationComponentDetailsResponse' :: GetApplicationComponentDetailsResponse -> Maybe Bool
$sel:associatedServerIds:GetApplicationComponentDetailsResponse' :: GetApplicationComponentDetailsResponse -> Maybe [Text]
$sel:associatedApplications:GetApplicationComponentDetailsResponse' :: GetApplicationComponentDetailsResponse
-> Maybe [AssociatedApplication]
$sel:applicationComponentDetail:GetApplicationComponentDetailsResponse' :: GetApplicationComponentDetailsResponse
-> Maybe ApplicationComponentDetail
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe ApplicationComponentDetail
applicationComponentDetail
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [AssociatedApplication]
associatedApplications
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Text]
associatedServerIds
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
moreApplicationResource
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus