{-# 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.Discovery.GetDiscoverySummary
-- 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 a short summary of discovered assets.
--
-- This API operation takes no request parameters and is called as is at
-- the command prompt as shown in the example.
module Amazonka.Discovery.GetDiscoverySummary
  ( -- * Creating a Request
    GetDiscoverySummary (..),
    newGetDiscoverySummary,

    -- * Destructuring the Response
    GetDiscoverySummaryResponse (..),
    newGetDiscoverySummaryResponse,

    -- * Response Lenses
    getDiscoverySummaryResponse_agentSummary,
    getDiscoverySummaryResponse_agentlessCollectorSummary,
    getDiscoverySummaryResponse_applications,
    getDiscoverySummaryResponse_connectorSummary,
    getDiscoverySummaryResponse_meCollectorSummary,
    getDiscoverySummaryResponse_servers,
    getDiscoverySummaryResponse_serversMappedToApplications,
    getDiscoverySummaryResponse_serversMappedtoTags,
    getDiscoverySummaryResponse_httpStatus,
  )
where

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

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

-- |
-- Create a value of 'GetDiscoverySummary' 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.
newGetDiscoverySummary ::
  GetDiscoverySummary
newGetDiscoverySummary :: GetDiscoverySummary
newGetDiscoverySummary = GetDiscoverySummary
GetDiscoverySummary'

instance Core.AWSRequest GetDiscoverySummary where
  type
    AWSResponse GetDiscoverySummary =
      GetDiscoverySummaryResponse
  request :: (Service -> Service)
-> GetDiscoverySummary -> Request GetDiscoverySummary
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 GetDiscoverySummary
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse GetDiscoverySummary)))
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 CustomerAgentInfo
-> Maybe CustomerAgentlessCollectorInfo
-> Maybe Integer
-> Maybe CustomerConnectorInfo
-> Maybe CustomerMeCollectorInfo
-> Maybe Integer
-> Maybe Integer
-> Maybe Integer
-> Int
-> GetDiscoverySummaryResponse
GetDiscoverySummaryResponse'
            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
"agentSummary")
            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
"agentlessCollectorSummary")
            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
"applications")
            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
"connectorSummary")
            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
"meCollectorSummary")
            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
"servers")
            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
"serversMappedToApplications")
            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
"serversMappedtoTags")
            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 GetDiscoverySummary where
  hashWithSalt :: Int -> GetDiscoverySummary -> Int
hashWithSalt Int
_salt GetDiscoverySummary
_ =
    Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` ()

instance Prelude.NFData GetDiscoverySummary where
  rnf :: GetDiscoverySummary -> ()
rnf GetDiscoverySummary
_ = ()

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

instance Data.ToJSON GetDiscoverySummary where
  toJSON :: GetDiscoverySummary -> Value
toJSON = forall a b. a -> b -> a
Prelude.const (Object -> Value
Data.Object forall a. Monoid a => a
Prelude.mempty)

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

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

-- | /See:/ 'newGetDiscoverySummaryResponse' smart constructor.
data GetDiscoverySummaryResponse = GetDiscoverySummaryResponse'
  { -- | Details about discovered agents, including agent status and health.
    GetDiscoverySummaryResponse -> Maybe CustomerAgentInfo
agentSummary :: Prelude.Maybe CustomerAgentInfo,
    GetDiscoverySummaryResponse -> Maybe CustomerAgentlessCollectorInfo
agentlessCollectorSummary :: Prelude.Maybe CustomerAgentlessCollectorInfo,
    -- | The number of applications discovered.
    GetDiscoverySummaryResponse -> Maybe Integer
applications :: Prelude.Maybe Prelude.Integer,
    -- | Details about discovered connectors, including connector status and
    -- health.
    GetDiscoverySummaryResponse -> Maybe CustomerConnectorInfo
connectorSummary :: Prelude.Maybe CustomerConnectorInfo,
    -- | Details about Migration Evaluator collectors, including collector status
    -- and health.
    GetDiscoverySummaryResponse -> Maybe CustomerMeCollectorInfo
meCollectorSummary :: Prelude.Maybe CustomerMeCollectorInfo,
    -- | The number of servers discovered.
    GetDiscoverySummaryResponse -> Maybe Integer
servers :: Prelude.Maybe Prelude.Integer,
    -- | The number of servers mapped to applications.
    GetDiscoverySummaryResponse -> Maybe Integer
serversMappedToApplications :: Prelude.Maybe Prelude.Integer,
    -- | The number of servers mapped to tags.
    GetDiscoverySummaryResponse -> Maybe Integer
serversMappedtoTags :: Prelude.Maybe Prelude.Integer,
    -- | The response's http status code.
    GetDiscoverySummaryResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (GetDiscoverySummaryResponse -> GetDiscoverySummaryResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetDiscoverySummaryResponse -> GetDiscoverySummaryResponse -> Bool
$c/= :: GetDiscoverySummaryResponse -> GetDiscoverySummaryResponse -> Bool
== :: GetDiscoverySummaryResponse -> GetDiscoverySummaryResponse -> Bool
$c== :: GetDiscoverySummaryResponse -> GetDiscoverySummaryResponse -> Bool
Prelude.Eq, ReadPrec [GetDiscoverySummaryResponse]
ReadPrec GetDiscoverySummaryResponse
Int -> ReadS GetDiscoverySummaryResponse
ReadS [GetDiscoverySummaryResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetDiscoverySummaryResponse]
$creadListPrec :: ReadPrec [GetDiscoverySummaryResponse]
readPrec :: ReadPrec GetDiscoverySummaryResponse
$creadPrec :: ReadPrec GetDiscoverySummaryResponse
readList :: ReadS [GetDiscoverySummaryResponse]
$creadList :: ReadS [GetDiscoverySummaryResponse]
readsPrec :: Int -> ReadS GetDiscoverySummaryResponse
$creadsPrec :: Int -> ReadS GetDiscoverySummaryResponse
Prelude.Read, Int -> GetDiscoverySummaryResponse -> ShowS
[GetDiscoverySummaryResponse] -> ShowS
GetDiscoverySummaryResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetDiscoverySummaryResponse] -> ShowS
$cshowList :: [GetDiscoverySummaryResponse] -> ShowS
show :: GetDiscoverySummaryResponse -> String
$cshow :: GetDiscoverySummaryResponse -> String
showsPrec :: Int -> GetDiscoverySummaryResponse -> ShowS
$cshowsPrec :: Int -> GetDiscoverySummaryResponse -> ShowS
Prelude.Show, forall x.
Rep GetDiscoverySummaryResponse x -> GetDiscoverySummaryResponse
forall x.
GetDiscoverySummaryResponse -> Rep GetDiscoverySummaryResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep GetDiscoverySummaryResponse x -> GetDiscoverySummaryResponse
$cfrom :: forall x.
GetDiscoverySummaryResponse -> Rep GetDiscoverySummaryResponse x
Prelude.Generic)

-- |
-- Create a value of 'GetDiscoverySummaryResponse' 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:
--
-- 'agentSummary', 'getDiscoverySummaryResponse_agentSummary' - Details about discovered agents, including agent status and health.
--
-- 'agentlessCollectorSummary', 'getDiscoverySummaryResponse_agentlessCollectorSummary' - Undocumented member.
--
-- 'applications', 'getDiscoverySummaryResponse_applications' - The number of applications discovered.
--
-- 'connectorSummary', 'getDiscoverySummaryResponse_connectorSummary' - Details about discovered connectors, including connector status and
-- health.
--
-- 'meCollectorSummary', 'getDiscoverySummaryResponse_meCollectorSummary' - Details about Migration Evaluator collectors, including collector status
-- and health.
--
-- 'servers', 'getDiscoverySummaryResponse_servers' - The number of servers discovered.
--
-- 'serversMappedToApplications', 'getDiscoverySummaryResponse_serversMappedToApplications' - The number of servers mapped to applications.
--
-- 'serversMappedtoTags', 'getDiscoverySummaryResponse_serversMappedtoTags' - The number of servers mapped to tags.
--
-- 'httpStatus', 'getDiscoverySummaryResponse_httpStatus' - The response's http status code.
newGetDiscoverySummaryResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  GetDiscoverySummaryResponse
newGetDiscoverySummaryResponse :: Int -> GetDiscoverySummaryResponse
newGetDiscoverySummaryResponse Int
pHttpStatus_ =
  GetDiscoverySummaryResponse'
    { $sel:agentSummary:GetDiscoverySummaryResponse' :: Maybe CustomerAgentInfo
agentSummary =
        forall a. Maybe a
Prelude.Nothing,
      $sel:agentlessCollectorSummary:GetDiscoverySummaryResponse' :: Maybe CustomerAgentlessCollectorInfo
agentlessCollectorSummary = forall a. Maybe a
Prelude.Nothing,
      $sel:applications:GetDiscoverySummaryResponse' :: Maybe Integer
applications = forall a. Maybe a
Prelude.Nothing,
      $sel:connectorSummary:GetDiscoverySummaryResponse' :: Maybe CustomerConnectorInfo
connectorSummary = forall a. Maybe a
Prelude.Nothing,
      $sel:meCollectorSummary:GetDiscoverySummaryResponse' :: Maybe CustomerMeCollectorInfo
meCollectorSummary = forall a. Maybe a
Prelude.Nothing,
      $sel:servers:GetDiscoverySummaryResponse' :: Maybe Integer
servers = forall a. Maybe a
Prelude.Nothing,
      $sel:serversMappedToApplications:GetDiscoverySummaryResponse' :: Maybe Integer
serversMappedToApplications = forall a. Maybe a
Prelude.Nothing,
      $sel:serversMappedtoTags:GetDiscoverySummaryResponse' :: Maybe Integer
serversMappedtoTags = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:GetDiscoverySummaryResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | Details about discovered agents, including agent status and health.
getDiscoverySummaryResponse_agentSummary :: Lens.Lens' GetDiscoverySummaryResponse (Prelude.Maybe CustomerAgentInfo)
getDiscoverySummaryResponse_agentSummary :: Lens' GetDiscoverySummaryResponse (Maybe CustomerAgentInfo)
getDiscoverySummaryResponse_agentSummary = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDiscoverySummaryResponse' {Maybe CustomerAgentInfo
agentSummary :: Maybe CustomerAgentInfo
$sel:agentSummary:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Maybe CustomerAgentInfo
agentSummary} -> Maybe CustomerAgentInfo
agentSummary) (\s :: GetDiscoverySummaryResponse
s@GetDiscoverySummaryResponse' {} Maybe CustomerAgentInfo
a -> GetDiscoverySummaryResponse
s {$sel:agentSummary:GetDiscoverySummaryResponse' :: Maybe CustomerAgentInfo
agentSummary = Maybe CustomerAgentInfo
a} :: GetDiscoverySummaryResponse)

-- | Undocumented member.
getDiscoverySummaryResponse_agentlessCollectorSummary :: Lens.Lens' GetDiscoverySummaryResponse (Prelude.Maybe CustomerAgentlessCollectorInfo)
getDiscoverySummaryResponse_agentlessCollectorSummary :: Lens'
  GetDiscoverySummaryResponse (Maybe CustomerAgentlessCollectorInfo)
getDiscoverySummaryResponse_agentlessCollectorSummary = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDiscoverySummaryResponse' {Maybe CustomerAgentlessCollectorInfo
agentlessCollectorSummary :: Maybe CustomerAgentlessCollectorInfo
$sel:agentlessCollectorSummary:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Maybe CustomerAgentlessCollectorInfo
agentlessCollectorSummary} -> Maybe CustomerAgentlessCollectorInfo
agentlessCollectorSummary) (\s :: GetDiscoverySummaryResponse
s@GetDiscoverySummaryResponse' {} Maybe CustomerAgentlessCollectorInfo
a -> GetDiscoverySummaryResponse
s {$sel:agentlessCollectorSummary:GetDiscoverySummaryResponse' :: Maybe CustomerAgentlessCollectorInfo
agentlessCollectorSummary = Maybe CustomerAgentlessCollectorInfo
a} :: GetDiscoverySummaryResponse)

-- | The number of applications discovered.
getDiscoverySummaryResponse_applications :: Lens.Lens' GetDiscoverySummaryResponse (Prelude.Maybe Prelude.Integer)
getDiscoverySummaryResponse_applications :: Lens' GetDiscoverySummaryResponse (Maybe Integer)
getDiscoverySummaryResponse_applications = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDiscoverySummaryResponse' {Maybe Integer
applications :: Maybe Integer
$sel:applications:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Maybe Integer
applications} -> Maybe Integer
applications) (\s :: GetDiscoverySummaryResponse
s@GetDiscoverySummaryResponse' {} Maybe Integer
a -> GetDiscoverySummaryResponse
s {$sel:applications:GetDiscoverySummaryResponse' :: Maybe Integer
applications = Maybe Integer
a} :: GetDiscoverySummaryResponse)

-- | Details about discovered connectors, including connector status and
-- health.
getDiscoverySummaryResponse_connectorSummary :: Lens.Lens' GetDiscoverySummaryResponse (Prelude.Maybe CustomerConnectorInfo)
getDiscoverySummaryResponse_connectorSummary :: Lens' GetDiscoverySummaryResponse (Maybe CustomerConnectorInfo)
getDiscoverySummaryResponse_connectorSummary = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDiscoverySummaryResponse' {Maybe CustomerConnectorInfo
connectorSummary :: Maybe CustomerConnectorInfo
$sel:connectorSummary:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Maybe CustomerConnectorInfo
connectorSummary} -> Maybe CustomerConnectorInfo
connectorSummary) (\s :: GetDiscoverySummaryResponse
s@GetDiscoverySummaryResponse' {} Maybe CustomerConnectorInfo
a -> GetDiscoverySummaryResponse
s {$sel:connectorSummary:GetDiscoverySummaryResponse' :: Maybe CustomerConnectorInfo
connectorSummary = Maybe CustomerConnectorInfo
a} :: GetDiscoverySummaryResponse)

-- | Details about Migration Evaluator collectors, including collector status
-- and health.
getDiscoverySummaryResponse_meCollectorSummary :: Lens.Lens' GetDiscoverySummaryResponse (Prelude.Maybe CustomerMeCollectorInfo)
getDiscoverySummaryResponse_meCollectorSummary :: Lens' GetDiscoverySummaryResponse (Maybe CustomerMeCollectorInfo)
getDiscoverySummaryResponse_meCollectorSummary = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDiscoverySummaryResponse' {Maybe CustomerMeCollectorInfo
meCollectorSummary :: Maybe CustomerMeCollectorInfo
$sel:meCollectorSummary:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Maybe CustomerMeCollectorInfo
meCollectorSummary} -> Maybe CustomerMeCollectorInfo
meCollectorSummary) (\s :: GetDiscoverySummaryResponse
s@GetDiscoverySummaryResponse' {} Maybe CustomerMeCollectorInfo
a -> GetDiscoverySummaryResponse
s {$sel:meCollectorSummary:GetDiscoverySummaryResponse' :: Maybe CustomerMeCollectorInfo
meCollectorSummary = Maybe CustomerMeCollectorInfo
a} :: GetDiscoverySummaryResponse)

-- | The number of servers discovered.
getDiscoverySummaryResponse_servers :: Lens.Lens' GetDiscoverySummaryResponse (Prelude.Maybe Prelude.Integer)
getDiscoverySummaryResponse_servers :: Lens' GetDiscoverySummaryResponse (Maybe Integer)
getDiscoverySummaryResponse_servers = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDiscoverySummaryResponse' {Maybe Integer
servers :: Maybe Integer
$sel:servers:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Maybe Integer
servers} -> Maybe Integer
servers) (\s :: GetDiscoverySummaryResponse
s@GetDiscoverySummaryResponse' {} Maybe Integer
a -> GetDiscoverySummaryResponse
s {$sel:servers:GetDiscoverySummaryResponse' :: Maybe Integer
servers = Maybe Integer
a} :: GetDiscoverySummaryResponse)

-- | The number of servers mapped to applications.
getDiscoverySummaryResponse_serversMappedToApplications :: Lens.Lens' GetDiscoverySummaryResponse (Prelude.Maybe Prelude.Integer)
getDiscoverySummaryResponse_serversMappedToApplications :: Lens' GetDiscoverySummaryResponse (Maybe Integer)
getDiscoverySummaryResponse_serversMappedToApplications = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDiscoverySummaryResponse' {Maybe Integer
serversMappedToApplications :: Maybe Integer
$sel:serversMappedToApplications:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Maybe Integer
serversMappedToApplications} -> Maybe Integer
serversMappedToApplications) (\s :: GetDiscoverySummaryResponse
s@GetDiscoverySummaryResponse' {} Maybe Integer
a -> GetDiscoverySummaryResponse
s {$sel:serversMappedToApplications:GetDiscoverySummaryResponse' :: Maybe Integer
serversMappedToApplications = Maybe Integer
a} :: GetDiscoverySummaryResponse)

-- | The number of servers mapped to tags.
getDiscoverySummaryResponse_serversMappedtoTags :: Lens.Lens' GetDiscoverySummaryResponse (Prelude.Maybe Prelude.Integer)
getDiscoverySummaryResponse_serversMappedtoTags :: Lens' GetDiscoverySummaryResponse (Maybe Integer)
getDiscoverySummaryResponse_serversMappedtoTags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDiscoverySummaryResponse' {Maybe Integer
serversMappedtoTags :: Maybe Integer
$sel:serversMappedtoTags:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Maybe Integer
serversMappedtoTags} -> Maybe Integer
serversMappedtoTags) (\s :: GetDiscoverySummaryResponse
s@GetDiscoverySummaryResponse' {} Maybe Integer
a -> GetDiscoverySummaryResponse
s {$sel:serversMappedtoTags:GetDiscoverySummaryResponse' :: Maybe Integer
serversMappedtoTags = Maybe Integer
a} :: GetDiscoverySummaryResponse)

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

instance Prelude.NFData GetDiscoverySummaryResponse where
  rnf :: GetDiscoverySummaryResponse -> ()
rnf GetDiscoverySummaryResponse' {Int
Maybe Integer
Maybe CustomerAgentInfo
Maybe CustomerAgentlessCollectorInfo
Maybe CustomerConnectorInfo
Maybe CustomerMeCollectorInfo
httpStatus :: Int
serversMappedtoTags :: Maybe Integer
serversMappedToApplications :: Maybe Integer
servers :: Maybe Integer
meCollectorSummary :: Maybe CustomerMeCollectorInfo
connectorSummary :: Maybe CustomerConnectorInfo
applications :: Maybe Integer
agentlessCollectorSummary :: Maybe CustomerAgentlessCollectorInfo
agentSummary :: Maybe CustomerAgentInfo
$sel:httpStatus:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Int
$sel:serversMappedtoTags:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Maybe Integer
$sel:serversMappedToApplications:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Maybe Integer
$sel:servers:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Maybe Integer
$sel:meCollectorSummary:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Maybe CustomerMeCollectorInfo
$sel:connectorSummary:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Maybe CustomerConnectorInfo
$sel:applications:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Maybe Integer
$sel:agentlessCollectorSummary:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Maybe CustomerAgentlessCollectorInfo
$sel:agentSummary:GetDiscoverySummaryResponse' :: GetDiscoverySummaryResponse -> Maybe CustomerAgentInfo
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe CustomerAgentInfo
agentSummary
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe CustomerAgentlessCollectorInfo
agentlessCollectorSummary
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
applications
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe CustomerConnectorInfo
connectorSummary
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe CustomerMeCollectorInfo
meCollectorSummary
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
servers
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
serversMappedToApplications
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
serversMappedtoTags
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus