{-# 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.GroundStation.GetDataflowEndpointGroup
-- 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 dataflow endpoint group.
module Amazonka.GroundStation.GetDataflowEndpointGroup
  ( -- * Creating a Request
    GetDataflowEndpointGroup (..),
    newGetDataflowEndpointGroup,

    -- * Request Lenses
    getDataflowEndpointGroup_dataflowEndpointGroupId,

    -- * Destructuring the Response
    GetDataflowEndpointGroupResponse (..),
    newGetDataflowEndpointGroupResponse,

    -- * Response Lenses
    getDataflowEndpointGroupResponse_dataflowEndpointGroupArn,
    getDataflowEndpointGroupResponse_dataflowEndpointGroupId,
    getDataflowEndpointGroupResponse_endpointsDetails,
    getDataflowEndpointGroupResponse_tags,
    getDataflowEndpointGroupResponse_httpStatus,
  )
where

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

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

-- |
-- Create a value of 'GetDataflowEndpointGroup' 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:
--
-- 'dataflowEndpointGroupId', 'getDataflowEndpointGroup_dataflowEndpointGroupId' - UUID of a dataflow endpoint group.
newGetDataflowEndpointGroup ::
  -- | 'dataflowEndpointGroupId'
  Prelude.Text ->
  GetDataflowEndpointGroup
newGetDataflowEndpointGroup :: Text -> GetDataflowEndpointGroup
newGetDataflowEndpointGroup Text
pDataflowEndpointGroupId_ =
  GetDataflowEndpointGroup'
    { $sel:dataflowEndpointGroupId:GetDataflowEndpointGroup' :: Text
dataflowEndpointGroupId =
        Text
pDataflowEndpointGroupId_
    }

-- | UUID of a dataflow endpoint group.
getDataflowEndpointGroup_dataflowEndpointGroupId :: Lens.Lens' GetDataflowEndpointGroup Prelude.Text
getDataflowEndpointGroup_dataflowEndpointGroupId :: Lens' GetDataflowEndpointGroup Text
getDataflowEndpointGroup_dataflowEndpointGroupId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDataflowEndpointGroup' {Text
dataflowEndpointGroupId :: Text
$sel:dataflowEndpointGroupId:GetDataflowEndpointGroup' :: GetDataflowEndpointGroup -> Text
dataflowEndpointGroupId} -> Text
dataflowEndpointGroupId) (\s :: GetDataflowEndpointGroup
s@GetDataflowEndpointGroup' {} Text
a -> GetDataflowEndpointGroup
s {$sel:dataflowEndpointGroupId:GetDataflowEndpointGroup' :: Text
dataflowEndpointGroupId = Text
a} :: GetDataflowEndpointGroup)

instance Core.AWSRequest GetDataflowEndpointGroup where
  type
    AWSResponse GetDataflowEndpointGroup =
      GetDataflowEndpointGroupResponse
  request :: (Service -> Service)
-> GetDataflowEndpointGroup -> Request GetDataflowEndpointGroup
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 GetDataflowEndpointGroup
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse GetDataflowEndpointGroup)))
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 [EndpointDetails]
-> Maybe (HashMap Text Text)
-> Int
-> GetDataflowEndpointGroupResponse
GetDataflowEndpointGroupResponse'
            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
"dataflowEndpointGroupArn")
            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
"dataflowEndpointGroupId")
            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
"endpointsDetails"
                            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.<*> (forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure (forall a. Enum a => a -> Int
Prelude.fromEnum Int
s))
      )

instance Prelude.Hashable GetDataflowEndpointGroup where
  hashWithSalt :: Int -> GetDataflowEndpointGroup -> Int
hashWithSalt Int
_salt GetDataflowEndpointGroup' {Text
dataflowEndpointGroupId :: Text
$sel:dataflowEndpointGroupId:GetDataflowEndpointGroup' :: GetDataflowEndpointGroup -> Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
dataflowEndpointGroupId

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

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

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

-- |
--
-- /See:/ 'newGetDataflowEndpointGroupResponse' smart constructor.
data GetDataflowEndpointGroupResponse = GetDataflowEndpointGroupResponse'
  { -- | ARN of a dataflow endpoint group.
    GetDataflowEndpointGroupResponse -> Maybe Text
dataflowEndpointGroupArn :: Prelude.Maybe Prelude.Text,
    -- | UUID of a dataflow endpoint group.
    GetDataflowEndpointGroupResponse -> Maybe Text
dataflowEndpointGroupId :: Prelude.Maybe Prelude.Text,
    -- | Details of a dataflow endpoint.
    GetDataflowEndpointGroupResponse -> Maybe [EndpointDetails]
endpointsDetails :: Prelude.Maybe [EndpointDetails],
    -- | Tags assigned to a dataflow endpoint group.
    GetDataflowEndpointGroupResponse -> Maybe (HashMap Text Text)
tags :: Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text),
    -- | The response's http status code.
    GetDataflowEndpointGroupResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (GetDataflowEndpointGroupResponse
-> GetDataflowEndpointGroupResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetDataflowEndpointGroupResponse
-> GetDataflowEndpointGroupResponse -> Bool
$c/= :: GetDataflowEndpointGroupResponse
-> GetDataflowEndpointGroupResponse -> Bool
== :: GetDataflowEndpointGroupResponse
-> GetDataflowEndpointGroupResponse -> Bool
$c== :: GetDataflowEndpointGroupResponse
-> GetDataflowEndpointGroupResponse -> Bool
Prelude.Eq, ReadPrec [GetDataflowEndpointGroupResponse]
ReadPrec GetDataflowEndpointGroupResponse
Int -> ReadS GetDataflowEndpointGroupResponse
ReadS [GetDataflowEndpointGroupResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetDataflowEndpointGroupResponse]
$creadListPrec :: ReadPrec [GetDataflowEndpointGroupResponse]
readPrec :: ReadPrec GetDataflowEndpointGroupResponse
$creadPrec :: ReadPrec GetDataflowEndpointGroupResponse
readList :: ReadS [GetDataflowEndpointGroupResponse]
$creadList :: ReadS [GetDataflowEndpointGroupResponse]
readsPrec :: Int -> ReadS GetDataflowEndpointGroupResponse
$creadsPrec :: Int -> ReadS GetDataflowEndpointGroupResponse
Prelude.Read, Int -> GetDataflowEndpointGroupResponse -> ShowS
[GetDataflowEndpointGroupResponse] -> ShowS
GetDataflowEndpointGroupResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetDataflowEndpointGroupResponse] -> ShowS
$cshowList :: [GetDataflowEndpointGroupResponse] -> ShowS
show :: GetDataflowEndpointGroupResponse -> String
$cshow :: GetDataflowEndpointGroupResponse -> String
showsPrec :: Int -> GetDataflowEndpointGroupResponse -> ShowS
$cshowsPrec :: Int -> GetDataflowEndpointGroupResponse -> ShowS
Prelude.Show, forall x.
Rep GetDataflowEndpointGroupResponse x
-> GetDataflowEndpointGroupResponse
forall x.
GetDataflowEndpointGroupResponse
-> Rep GetDataflowEndpointGroupResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep GetDataflowEndpointGroupResponse x
-> GetDataflowEndpointGroupResponse
$cfrom :: forall x.
GetDataflowEndpointGroupResponse
-> Rep GetDataflowEndpointGroupResponse x
Prelude.Generic)

-- |
-- Create a value of 'GetDataflowEndpointGroupResponse' 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:
--
-- 'dataflowEndpointGroupArn', 'getDataflowEndpointGroupResponse_dataflowEndpointGroupArn' - ARN of a dataflow endpoint group.
--
-- 'dataflowEndpointGroupId', 'getDataflowEndpointGroupResponse_dataflowEndpointGroupId' - UUID of a dataflow endpoint group.
--
-- 'endpointsDetails', 'getDataflowEndpointGroupResponse_endpointsDetails' - Details of a dataflow endpoint.
--
-- 'tags', 'getDataflowEndpointGroupResponse_tags' - Tags assigned to a dataflow endpoint group.
--
-- 'httpStatus', 'getDataflowEndpointGroupResponse_httpStatus' - The response's http status code.
newGetDataflowEndpointGroupResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  GetDataflowEndpointGroupResponse
newGetDataflowEndpointGroupResponse :: Int -> GetDataflowEndpointGroupResponse
newGetDataflowEndpointGroupResponse Int
pHttpStatus_ =
  GetDataflowEndpointGroupResponse'
    { $sel:dataflowEndpointGroupArn:GetDataflowEndpointGroupResponse' :: Maybe Text
dataflowEndpointGroupArn =
        forall a. Maybe a
Prelude.Nothing,
      $sel:dataflowEndpointGroupId:GetDataflowEndpointGroupResponse' :: Maybe Text
dataflowEndpointGroupId = forall a. Maybe a
Prelude.Nothing,
      $sel:endpointsDetails:GetDataflowEndpointGroupResponse' :: Maybe [EndpointDetails]
endpointsDetails = forall a. Maybe a
Prelude.Nothing,
      $sel:tags:GetDataflowEndpointGroupResponse' :: Maybe (HashMap Text Text)
tags = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:GetDataflowEndpointGroupResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | ARN of a dataflow endpoint group.
getDataflowEndpointGroupResponse_dataflowEndpointGroupArn :: Lens.Lens' GetDataflowEndpointGroupResponse (Prelude.Maybe Prelude.Text)
getDataflowEndpointGroupResponse_dataflowEndpointGroupArn :: Lens' GetDataflowEndpointGroupResponse (Maybe Text)
getDataflowEndpointGroupResponse_dataflowEndpointGroupArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDataflowEndpointGroupResponse' {Maybe Text
dataflowEndpointGroupArn :: Maybe Text
$sel:dataflowEndpointGroupArn:GetDataflowEndpointGroupResponse' :: GetDataflowEndpointGroupResponse -> Maybe Text
dataflowEndpointGroupArn} -> Maybe Text
dataflowEndpointGroupArn) (\s :: GetDataflowEndpointGroupResponse
s@GetDataflowEndpointGroupResponse' {} Maybe Text
a -> GetDataflowEndpointGroupResponse
s {$sel:dataflowEndpointGroupArn:GetDataflowEndpointGroupResponse' :: Maybe Text
dataflowEndpointGroupArn = Maybe Text
a} :: GetDataflowEndpointGroupResponse)

-- | UUID of a dataflow endpoint group.
getDataflowEndpointGroupResponse_dataflowEndpointGroupId :: Lens.Lens' GetDataflowEndpointGroupResponse (Prelude.Maybe Prelude.Text)
getDataflowEndpointGroupResponse_dataflowEndpointGroupId :: Lens' GetDataflowEndpointGroupResponse (Maybe Text)
getDataflowEndpointGroupResponse_dataflowEndpointGroupId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDataflowEndpointGroupResponse' {Maybe Text
dataflowEndpointGroupId :: Maybe Text
$sel:dataflowEndpointGroupId:GetDataflowEndpointGroupResponse' :: GetDataflowEndpointGroupResponse -> Maybe Text
dataflowEndpointGroupId} -> Maybe Text
dataflowEndpointGroupId) (\s :: GetDataflowEndpointGroupResponse
s@GetDataflowEndpointGroupResponse' {} Maybe Text
a -> GetDataflowEndpointGroupResponse
s {$sel:dataflowEndpointGroupId:GetDataflowEndpointGroupResponse' :: Maybe Text
dataflowEndpointGroupId = Maybe Text
a} :: GetDataflowEndpointGroupResponse)

-- | Details of a dataflow endpoint.
getDataflowEndpointGroupResponse_endpointsDetails :: Lens.Lens' GetDataflowEndpointGroupResponse (Prelude.Maybe [EndpointDetails])
getDataflowEndpointGroupResponse_endpointsDetails :: Lens' GetDataflowEndpointGroupResponse (Maybe [EndpointDetails])
getDataflowEndpointGroupResponse_endpointsDetails = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDataflowEndpointGroupResponse' {Maybe [EndpointDetails]
endpointsDetails :: Maybe [EndpointDetails]
$sel:endpointsDetails:GetDataflowEndpointGroupResponse' :: GetDataflowEndpointGroupResponse -> Maybe [EndpointDetails]
endpointsDetails} -> Maybe [EndpointDetails]
endpointsDetails) (\s :: GetDataflowEndpointGroupResponse
s@GetDataflowEndpointGroupResponse' {} Maybe [EndpointDetails]
a -> GetDataflowEndpointGroupResponse
s {$sel:endpointsDetails:GetDataflowEndpointGroupResponse' :: Maybe [EndpointDetails]
endpointsDetails = Maybe [EndpointDetails]
a} :: GetDataflowEndpointGroupResponse) 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

-- | Tags assigned to a dataflow endpoint group.
getDataflowEndpointGroupResponse_tags :: Lens.Lens' GetDataflowEndpointGroupResponse (Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text))
getDataflowEndpointGroupResponse_tags :: Lens' GetDataflowEndpointGroupResponse (Maybe (HashMap Text Text))
getDataflowEndpointGroupResponse_tags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDataflowEndpointGroupResponse' {Maybe (HashMap Text Text)
tags :: Maybe (HashMap Text Text)
$sel:tags:GetDataflowEndpointGroupResponse' :: GetDataflowEndpointGroupResponse -> Maybe (HashMap Text Text)
tags} -> Maybe (HashMap Text Text)
tags) (\s :: GetDataflowEndpointGroupResponse
s@GetDataflowEndpointGroupResponse' {} Maybe (HashMap Text Text)
a -> GetDataflowEndpointGroupResponse
s {$sel:tags:GetDataflowEndpointGroupResponse' :: Maybe (HashMap Text Text)
tags = Maybe (HashMap Text Text)
a} :: GetDataflowEndpointGroupResponse) 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 response's http status code.
getDataflowEndpointGroupResponse_httpStatus :: Lens.Lens' GetDataflowEndpointGroupResponse Prelude.Int
getDataflowEndpointGroupResponse_httpStatus :: Lens' GetDataflowEndpointGroupResponse Int
getDataflowEndpointGroupResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDataflowEndpointGroupResponse' {Int
httpStatus :: Int
$sel:httpStatus:GetDataflowEndpointGroupResponse' :: GetDataflowEndpointGroupResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: GetDataflowEndpointGroupResponse
s@GetDataflowEndpointGroupResponse' {} Int
a -> GetDataflowEndpointGroupResponse
s {$sel:httpStatus:GetDataflowEndpointGroupResponse' :: Int
httpStatus = Int
a} :: GetDataflowEndpointGroupResponse)

instance
  Prelude.NFData
    GetDataflowEndpointGroupResponse
  where
  rnf :: GetDataflowEndpointGroupResponse -> ()
rnf GetDataflowEndpointGroupResponse' {Int
Maybe [EndpointDetails]
Maybe Text
Maybe (HashMap Text Text)
httpStatus :: Int
tags :: Maybe (HashMap Text Text)
endpointsDetails :: Maybe [EndpointDetails]
dataflowEndpointGroupId :: Maybe Text
dataflowEndpointGroupArn :: Maybe Text
$sel:httpStatus:GetDataflowEndpointGroupResponse' :: GetDataflowEndpointGroupResponse -> Int
$sel:tags:GetDataflowEndpointGroupResponse' :: GetDataflowEndpointGroupResponse -> Maybe (HashMap Text Text)
$sel:endpointsDetails:GetDataflowEndpointGroupResponse' :: GetDataflowEndpointGroupResponse -> Maybe [EndpointDetails]
$sel:dataflowEndpointGroupId:GetDataflowEndpointGroupResponse' :: GetDataflowEndpointGroupResponse -> Maybe Text
$sel:dataflowEndpointGroupArn:GetDataflowEndpointGroupResponse' :: GetDataflowEndpointGroupResponse -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
dataflowEndpointGroupArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
dataflowEndpointGroupId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [EndpointDetails]
endpointsDetails
      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 Int
httpStatus