{-# 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.GuardDuty.ListThreatIntelSets
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Lists the ThreatIntelSets of the GuardDuty service specified by the
-- detector ID. If you use this operation from a member account, the
-- ThreatIntelSets associated with the administrator account are returned.
--
-- This operation returns paginated results.
module Amazonka.GuardDuty.ListThreatIntelSets
  ( -- * Creating a Request
    ListThreatIntelSets (..),
    newListThreatIntelSets,

    -- * Request Lenses
    listThreatIntelSets_maxResults,
    listThreatIntelSets_nextToken,
    listThreatIntelSets_detectorId,

    -- * Destructuring the Response
    ListThreatIntelSetsResponse (..),
    newListThreatIntelSetsResponse,

    -- * Response Lenses
    listThreatIntelSetsResponse_nextToken,
    listThreatIntelSetsResponse_httpStatus,
    listThreatIntelSetsResponse_threatIntelSetIds,
  )
where

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

-- | /See:/ 'newListThreatIntelSets' smart constructor.
data ListThreatIntelSets = ListThreatIntelSets'
  { -- | You can use this parameter to indicate the maximum number of items that
    -- you want in the response. The default value is 50. The maximum value is
    -- 50.
    ListThreatIntelSets -> Maybe Natural
maxResults :: Prelude.Maybe Prelude.Natural,
    -- | You can use this parameter to paginate results in the response. Set the
    -- value of this parameter to null on your first call to the list action.
    -- For subsequent calls to the action, fill nextToken in the request with
    -- the value of NextToken from the previous response to continue listing
    -- data.
    ListThreatIntelSets -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
    -- | The unique ID of the detector that the threatIntelSet is associated
    -- with.
    ListThreatIntelSets -> Text
detectorId :: Prelude.Text
  }
  deriving (ListThreatIntelSets -> ListThreatIntelSets -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListThreatIntelSets -> ListThreatIntelSets -> Bool
$c/= :: ListThreatIntelSets -> ListThreatIntelSets -> Bool
== :: ListThreatIntelSets -> ListThreatIntelSets -> Bool
$c== :: ListThreatIntelSets -> ListThreatIntelSets -> Bool
Prelude.Eq, ReadPrec [ListThreatIntelSets]
ReadPrec ListThreatIntelSets
Int -> ReadS ListThreatIntelSets
ReadS [ListThreatIntelSets]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListThreatIntelSets]
$creadListPrec :: ReadPrec [ListThreatIntelSets]
readPrec :: ReadPrec ListThreatIntelSets
$creadPrec :: ReadPrec ListThreatIntelSets
readList :: ReadS [ListThreatIntelSets]
$creadList :: ReadS [ListThreatIntelSets]
readsPrec :: Int -> ReadS ListThreatIntelSets
$creadsPrec :: Int -> ReadS ListThreatIntelSets
Prelude.Read, Int -> ListThreatIntelSets -> ShowS
[ListThreatIntelSets] -> ShowS
ListThreatIntelSets -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListThreatIntelSets] -> ShowS
$cshowList :: [ListThreatIntelSets] -> ShowS
show :: ListThreatIntelSets -> String
$cshow :: ListThreatIntelSets -> String
showsPrec :: Int -> ListThreatIntelSets -> ShowS
$cshowsPrec :: Int -> ListThreatIntelSets -> ShowS
Prelude.Show, forall x. Rep ListThreatIntelSets x -> ListThreatIntelSets
forall x. ListThreatIntelSets -> Rep ListThreatIntelSets x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep ListThreatIntelSets x -> ListThreatIntelSets
$cfrom :: forall x. ListThreatIntelSets -> Rep ListThreatIntelSets x
Prelude.Generic)

-- |
-- Create a value of 'ListThreatIntelSets' 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:
--
-- 'maxResults', 'listThreatIntelSets_maxResults' - You can use this parameter to indicate the maximum number of items that
-- you want in the response. The default value is 50. The maximum value is
-- 50.
--
-- 'nextToken', 'listThreatIntelSets_nextToken' - You can use this parameter to paginate results in the response. Set the
-- value of this parameter to null on your first call to the list action.
-- For subsequent calls to the action, fill nextToken in the request with
-- the value of NextToken from the previous response to continue listing
-- data.
--
-- 'detectorId', 'listThreatIntelSets_detectorId' - The unique ID of the detector that the threatIntelSet is associated
-- with.
newListThreatIntelSets ::
  -- | 'detectorId'
  Prelude.Text ->
  ListThreatIntelSets
newListThreatIntelSets :: Text -> ListThreatIntelSets
newListThreatIntelSets Text
pDetectorId_ =
  ListThreatIntelSets'
    { $sel:maxResults:ListThreatIntelSets' :: Maybe Natural
maxResults = forall a. Maybe a
Prelude.Nothing,
      $sel:nextToken:ListThreatIntelSets' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing,
      $sel:detectorId:ListThreatIntelSets' :: Text
detectorId = Text
pDetectorId_
    }

-- | You can use this parameter to indicate the maximum number of items that
-- you want in the response. The default value is 50. The maximum value is
-- 50.
listThreatIntelSets_maxResults :: Lens.Lens' ListThreatIntelSets (Prelude.Maybe Prelude.Natural)
listThreatIntelSets_maxResults :: Lens' ListThreatIntelSets (Maybe Natural)
listThreatIntelSets_maxResults = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListThreatIntelSets' {Maybe Natural
maxResults :: Maybe Natural
$sel:maxResults:ListThreatIntelSets' :: ListThreatIntelSets -> Maybe Natural
maxResults} -> Maybe Natural
maxResults) (\s :: ListThreatIntelSets
s@ListThreatIntelSets' {} Maybe Natural
a -> ListThreatIntelSets
s {$sel:maxResults:ListThreatIntelSets' :: Maybe Natural
maxResults = Maybe Natural
a} :: ListThreatIntelSets)

-- | You can use this parameter to paginate results in the response. Set the
-- value of this parameter to null on your first call to the list action.
-- For subsequent calls to the action, fill nextToken in the request with
-- the value of NextToken from the previous response to continue listing
-- data.
listThreatIntelSets_nextToken :: Lens.Lens' ListThreatIntelSets (Prelude.Maybe Prelude.Text)
listThreatIntelSets_nextToken :: Lens' ListThreatIntelSets (Maybe Text)
listThreatIntelSets_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListThreatIntelSets' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:ListThreatIntelSets' :: ListThreatIntelSets -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: ListThreatIntelSets
s@ListThreatIntelSets' {} Maybe Text
a -> ListThreatIntelSets
s {$sel:nextToken:ListThreatIntelSets' :: Maybe Text
nextToken = Maybe Text
a} :: ListThreatIntelSets)

-- | The unique ID of the detector that the threatIntelSet is associated
-- with.
listThreatIntelSets_detectorId :: Lens.Lens' ListThreatIntelSets Prelude.Text
listThreatIntelSets_detectorId :: Lens' ListThreatIntelSets Text
listThreatIntelSets_detectorId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListThreatIntelSets' {Text
detectorId :: Text
$sel:detectorId:ListThreatIntelSets' :: ListThreatIntelSets -> Text
detectorId} -> Text
detectorId) (\s :: ListThreatIntelSets
s@ListThreatIntelSets' {} Text
a -> ListThreatIntelSets
s {$sel:detectorId:ListThreatIntelSets' :: Text
detectorId = Text
a} :: ListThreatIntelSets)

instance Core.AWSPager ListThreatIntelSets where
  page :: ListThreatIntelSets
-> AWSResponse ListThreatIntelSets -> Maybe ListThreatIntelSets
page ListThreatIntelSets
rq AWSResponse ListThreatIntelSets
rs
    | forall a. AWSTruncated a => a -> Bool
Core.stop
        ( AWSResponse ListThreatIntelSets
rs
            forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' ListThreatIntelSetsResponse (Maybe Text)
listThreatIntelSetsResponse_nextToken
            forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall a b. Prism (Maybe a) (Maybe b) a b
Lens._Just
        ) =
        forall a. Maybe a
Prelude.Nothing
    | forall a. AWSTruncated a => a -> Bool
Core.stop
        ( AWSResponse ListThreatIntelSets
rs
            forall s a. s -> Getting a s a -> a
Lens.^. Lens' ListThreatIntelSetsResponse [Text]
listThreatIntelSetsResponse_threatIntelSetIds
        ) =
        forall a. Maybe a
Prelude.Nothing
    | Bool
Prelude.otherwise =
        forall a. a -> Maybe a
Prelude.Just
          forall a b. (a -> b) -> a -> b
Prelude.$ ListThreatIntelSets
rq
          forall a b. a -> (a -> b) -> b
Prelude.& Lens' ListThreatIntelSets (Maybe Text)
listThreatIntelSets_nextToken
          forall s t a b. ASetter s t a b -> b -> s -> t
Lens..~ AWSResponse ListThreatIntelSets
rs
          forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' ListThreatIntelSetsResponse (Maybe Text)
listThreatIntelSetsResponse_nextToken
          forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall a b. Prism (Maybe a) (Maybe b) a b
Lens._Just

instance Core.AWSRequest ListThreatIntelSets where
  type
    AWSResponse ListThreatIntelSets =
      ListThreatIntelSetsResponse
  request :: (Service -> Service)
-> ListThreatIntelSets -> Request ListThreatIntelSets
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 ListThreatIntelSets
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse ListThreatIntelSets)))
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 -> Int -> [Text] -> ListThreatIntelSetsResponse
ListThreatIntelSetsResponse'
            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
"nextToken")
            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))
            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
"threatIntelSetIds"
                            forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ forall a. Monoid a => a
Prelude.mempty
                        )
      )

instance Prelude.Hashable ListThreatIntelSets where
  hashWithSalt :: Int -> ListThreatIntelSets -> Int
hashWithSalt Int
_salt ListThreatIntelSets' {Maybe Natural
Maybe Text
Text
detectorId :: Text
nextToken :: Maybe Text
maxResults :: Maybe Natural
$sel:detectorId:ListThreatIntelSets' :: ListThreatIntelSets -> Text
$sel:nextToken:ListThreatIntelSets' :: ListThreatIntelSets -> Maybe Text
$sel:maxResults:ListThreatIntelSets' :: ListThreatIntelSets -> Maybe Natural
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
maxResults
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
nextToken
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
detectorId

instance Prelude.NFData ListThreatIntelSets where
  rnf :: ListThreatIntelSets -> ()
rnf ListThreatIntelSets' {Maybe Natural
Maybe Text
Text
detectorId :: Text
nextToken :: Maybe Text
maxResults :: Maybe Natural
$sel:detectorId:ListThreatIntelSets' :: ListThreatIntelSets -> Text
$sel:nextToken:ListThreatIntelSets' :: ListThreatIntelSets -> Maybe Text
$sel:maxResults:ListThreatIntelSets' :: ListThreatIntelSets -> Maybe Natural
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
maxResults
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
nextToken
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
detectorId

instance Data.ToHeaders ListThreatIntelSets where
  toHeaders :: ListThreatIntelSets -> 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 ListThreatIntelSets where
  toPath :: ListThreatIntelSets -> ByteString
toPath ListThreatIntelSets' {Maybe Natural
Maybe Text
Text
detectorId :: Text
nextToken :: Maybe Text
maxResults :: Maybe Natural
$sel:detectorId:ListThreatIntelSets' :: ListThreatIntelSets -> Text
$sel:nextToken:ListThreatIntelSets' :: ListThreatIntelSets -> Maybe Text
$sel:maxResults:ListThreatIntelSets' :: ListThreatIntelSets -> Maybe Natural
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"/detector/",
        forall a. ToByteString a => a -> ByteString
Data.toBS Text
detectorId,
        ByteString
"/threatintelset"
      ]

instance Data.ToQuery ListThreatIntelSets where
  toQuery :: ListThreatIntelSets -> QueryString
toQuery ListThreatIntelSets' {Maybe Natural
Maybe Text
Text
detectorId :: Text
nextToken :: Maybe Text
maxResults :: Maybe Natural
$sel:detectorId:ListThreatIntelSets' :: ListThreatIntelSets -> Text
$sel:nextToken:ListThreatIntelSets' :: ListThreatIntelSets -> Maybe Text
$sel:maxResults:ListThreatIntelSets' :: ListThreatIntelSets -> Maybe Natural
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"maxResults" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Natural
maxResults,
        ByteString
"nextToken" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
nextToken
      ]

-- | /See:/ 'newListThreatIntelSetsResponse' smart constructor.
data ListThreatIntelSetsResponse = ListThreatIntelSetsResponse'
  { -- | The pagination parameter to be used on the next list operation to
    -- retrieve more items.
    ListThreatIntelSetsResponse -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
    -- | The response's http status code.
    ListThreatIntelSetsResponse -> Int
httpStatus :: Prelude.Int,
    -- | The IDs of the ThreatIntelSet resources.
    ListThreatIntelSetsResponse -> [Text]
threatIntelSetIds :: [Prelude.Text]
  }
  deriving (ListThreatIntelSetsResponse -> ListThreatIntelSetsResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListThreatIntelSetsResponse -> ListThreatIntelSetsResponse -> Bool
$c/= :: ListThreatIntelSetsResponse -> ListThreatIntelSetsResponse -> Bool
== :: ListThreatIntelSetsResponse -> ListThreatIntelSetsResponse -> Bool
$c== :: ListThreatIntelSetsResponse -> ListThreatIntelSetsResponse -> Bool
Prelude.Eq, ReadPrec [ListThreatIntelSetsResponse]
ReadPrec ListThreatIntelSetsResponse
Int -> ReadS ListThreatIntelSetsResponse
ReadS [ListThreatIntelSetsResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListThreatIntelSetsResponse]
$creadListPrec :: ReadPrec [ListThreatIntelSetsResponse]
readPrec :: ReadPrec ListThreatIntelSetsResponse
$creadPrec :: ReadPrec ListThreatIntelSetsResponse
readList :: ReadS [ListThreatIntelSetsResponse]
$creadList :: ReadS [ListThreatIntelSetsResponse]
readsPrec :: Int -> ReadS ListThreatIntelSetsResponse
$creadsPrec :: Int -> ReadS ListThreatIntelSetsResponse
Prelude.Read, Int -> ListThreatIntelSetsResponse -> ShowS
[ListThreatIntelSetsResponse] -> ShowS
ListThreatIntelSetsResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListThreatIntelSetsResponse] -> ShowS
$cshowList :: [ListThreatIntelSetsResponse] -> ShowS
show :: ListThreatIntelSetsResponse -> String
$cshow :: ListThreatIntelSetsResponse -> String
showsPrec :: Int -> ListThreatIntelSetsResponse -> ShowS
$cshowsPrec :: Int -> ListThreatIntelSetsResponse -> ShowS
Prelude.Show, forall x.
Rep ListThreatIntelSetsResponse x -> ListThreatIntelSetsResponse
forall x.
ListThreatIntelSetsResponse -> Rep ListThreatIntelSetsResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep ListThreatIntelSetsResponse x -> ListThreatIntelSetsResponse
$cfrom :: forall x.
ListThreatIntelSetsResponse -> Rep ListThreatIntelSetsResponse x
Prelude.Generic)

-- |
-- Create a value of 'ListThreatIntelSetsResponse' 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:
--
-- 'nextToken', 'listThreatIntelSetsResponse_nextToken' - The pagination parameter to be used on the next list operation to
-- retrieve more items.
--
-- 'httpStatus', 'listThreatIntelSetsResponse_httpStatus' - The response's http status code.
--
-- 'threatIntelSetIds', 'listThreatIntelSetsResponse_threatIntelSetIds' - The IDs of the ThreatIntelSet resources.
newListThreatIntelSetsResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  ListThreatIntelSetsResponse
newListThreatIntelSetsResponse :: Int -> ListThreatIntelSetsResponse
newListThreatIntelSetsResponse Int
pHttpStatus_ =
  ListThreatIntelSetsResponse'
    { $sel:nextToken:ListThreatIntelSetsResponse' :: Maybe Text
nextToken =
        forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:ListThreatIntelSetsResponse' :: Int
httpStatus = Int
pHttpStatus_,
      $sel:threatIntelSetIds:ListThreatIntelSetsResponse' :: [Text]
threatIntelSetIds = forall a. Monoid a => a
Prelude.mempty
    }

-- | The pagination parameter to be used on the next list operation to
-- retrieve more items.
listThreatIntelSetsResponse_nextToken :: Lens.Lens' ListThreatIntelSetsResponse (Prelude.Maybe Prelude.Text)
listThreatIntelSetsResponse_nextToken :: Lens' ListThreatIntelSetsResponse (Maybe Text)
listThreatIntelSetsResponse_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListThreatIntelSetsResponse' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:ListThreatIntelSetsResponse' :: ListThreatIntelSetsResponse -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: ListThreatIntelSetsResponse
s@ListThreatIntelSetsResponse' {} Maybe Text
a -> ListThreatIntelSetsResponse
s {$sel:nextToken:ListThreatIntelSetsResponse' :: Maybe Text
nextToken = Maybe Text
a} :: ListThreatIntelSetsResponse)

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

-- | The IDs of the ThreatIntelSet resources.
listThreatIntelSetsResponse_threatIntelSetIds :: Lens.Lens' ListThreatIntelSetsResponse [Prelude.Text]
listThreatIntelSetsResponse_threatIntelSetIds :: Lens' ListThreatIntelSetsResponse [Text]
listThreatIntelSetsResponse_threatIntelSetIds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListThreatIntelSetsResponse' {[Text]
threatIntelSetIds :: [Text]
$sel:threatIntelSetIds:ListThreatIntelSetsResponse' :: ListThreatIntelSetsResponse -> [Text]
threatIntelSetIds} -> [Text]
threatIntelSetIds) (\s :: ListThreatIntelSetsResponse
s@ListThreatIntelSetsResponse' {} [Text]
a -> ListThreatIntelSetsResponse
s {$sel:threatIntelSetIds:ListThreatIntelSetsResponse' :: [Text]
threatIntelSetIds = [Text]
a} :: ListThreatIntelSetsResponse) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

instance Prelude.NFData ListThreatIntelSetsResponse where
  rnf :: ListThreatIntelSetsResponse -> ()
rnf ListThreatIntelSetsResponse' {Int
[Text]
Maybe Text
threatIntelSetIds :: [Text]
httpStatus :: Int
nextToken :: Maybe Text
$sel:threatIntelSetIds:ListThreatIntelSetsResponse' :: ListThreatIntelSetsResponse -> [Text]
$sel:httpStatus:ListThreatIntelSetsResponse' :: ListThreatIntelSetsResponse -> Int
$sel:nextToken:ListThreatIntelSetsResponse' :: ListThreatIntelSetsResponse -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
nextToken
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf [Text]
threatIntelSetIds