{-# 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.IoT.ListOutgoingCertificates
-- 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 certificates that are being transferred but not yet accepted.
--
-- Requires permission to access the
-- <https://docs.aws.amazon.com/service-authorization/latest/reference/list_awsiot.html#awsiot-actions-as-permissions ListOutgoingCertificates>
-- action.
--
-- This operation returns paginated results.
module Amazonka.IoT.ListOutgoingCertificates
  ( -- * Creating a Request
    ListOutgoingCertificates (..),
    newListOutgoingCertificates,

    -- * Request Lenses
    listOutgoingCertificates_ascendingOrder,
    listOutgoingCertificates_marker,
    listOutgoingCertificates_pageSize,

    -- * Destructuring the Response
    ListOutgoingCertificatesResponse (..),
    newListOutgoingCertificatesResponse,

    -- * Response Lenses
    listOutgoingCertificatesResponse_nextMarker,
    listOutgoingCertificatesResponse_outgoingCertificates,
    listOutgoingCertificatesResponse_httpStatus,
  )
where

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

-- | The input to the ListOutgoingCertificates operation.
--
-- /See:/ 'newListOutgoingCertificates' smart constructor.
data ListOutgoingCertificates = ListOutgoingCertificates'
  { -- | Specifies the order for results. If True, the results are returned in
    -- ascending order, based on the creation date.
    ListOutgoingCertificates -> Maybe Bool
ascendingOrder :: Prelude.Maybe Prelude.Bool,
    -- | The marker for the next set of results.
    ListOutgoingCertificates -> Maybe Text
marker :: Prelude.Maybe Prelude.Text,
    -- | The result page size.
    ListOutgoingCertificates -> Maybe Natural
pageSize :: Prelude.Maybe Prelude.Natural
  }
  deriving (ListOutgoingCertificates -> ListOutgoingCertificates -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListOutgoingCertificates -> ListOutgoingCertificates -> Bool
$c/= :: ListOutgoingCertificates -> ListOutgoingCertificates -> Bool
== :: ListOutgoingCertificates -> ListOutgoingCertificates -> Bool
$c== :: ListOutgoingCertificates -> ListOutgoingCertificates -> Bool
Prelude.Eq, ReadPrec [ListOutgoingCertificates]
ReadPrec ListOutgoingCertificates
Int -> ReadS ListOutgoingCertificates
ReadS [ListOutgoingCertificates]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListOutgoingCertificates]
$creadListPrec :: ReadPrec [ListOutgoingCertificates]
readPrec :: ReadPrec ListOutgoingCertificates
$creadPrec :: ReadPrec ListOutgoingCertificates
readList :: ReadS [ListOutgoingCertificates]
$creadList :: ReadS [ListOutgoingCertificates]
readsPrec :: Int -> ReadS ListOutgoingCertificates
$creadsPrec :: Int -> ReadS ListOutgoingCertificates
Prelude.Read, Int -> ListOutgoingCertificates -> ShowS
[ListOutgoingCertificates] -> ShowS
ListOutgoingCertificates -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListOutgoingCertificates] -> ShowS
$cshowList :: [ListOutgoingCertificates] -> ShowS
show :: ListOutgoingCertificates -> String
$cshow :: ListOutgoingCertificates -> String
showsPrec :: Int -> ListOutgoingCertificates -> ShowS
$cshowsPrec :: Int -> ListOutgoingCertificates -> ShowS
Prelude.Show, forall x.
Rep ListOutgoingCertificates x -> ListOutgoingCertificates
forall x.
ListOutgoingCertificates -> Rep ListOutgoingCertificates x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep ListOutgoingCertificates x -> ListOutgoingCertificates
$cfrom :: forall x.
ListOutgoingCertificates -> Rep ListOutgoingCertificates x
Prelude.Generic)

-- |
-- Create a value of 'ListOutgoingCertificates' 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:
--
-- 'ascendingOrder', 'listOutgoingCertificates_ascendingOrder' - Specifies the order for results. If True, the results are returned in
-- ascending order, based on the creation date.
--
-- 'marker', 'listOutgoingCertificates_marker' - The marker for the next set of results.
--
-- 'pageSize', 'listOutgoingCertificates_pageSize' - The result page size.
newListOutgoingCertificates ::
  ListOutgoingCertificates
newListOutgoingCertificates :: ListOutgoingCertificates
newListOutgoingCertificates =
  ListOutgoingCertificates'
    { $sel:ascendingOrder:ListOutgoingCertificates' :: Maybe Bool
ascendingOrder =
        forall a. Maybe a
Prelude.Nothing,
      $sel:marker:ListOutgoingCertificates' :: Maybe Text
marker = forall a. Maybe a
Prelude.Nothing,
      $sel:pageSize:ListOutgoingCertificates' :: Maybe Natural
pageSize = forall a. Maybe a
Prelude.Nothing
    }

-- | Specifies the order for results. If True, the results are returned in
-- ascending order, based on the creation date.
listOutgoingCertificates_ascendingOrder :: Lens.Lens' ListOutgoingCertificates (Prelude.Maybe Prelude.Bool)
listOutgoingCertificates_ascendingOrder :: Lens' ListOutgoingCertificates (Maybe Bool)
listOutgoingCertificates_ascendingOrder = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListOutgoingCertificates' {Maybe Bool
ascendingOrder :: Maybe Bool
$sel:ascendingOrder:ListOutgoingCertificates' :: ListOutgoingCertificates -> Maybe Bool
ascendingOrder} -> Maybe Bool
ascendingOrder) (\s :: ListOutgoingCertificates
s@ListOutgoingCertificates' {} Maybe Bool
a -> ListOutgoingCertificates
s {$sel:ascendingOrder:ListOutgoingCertificates' :: Maybe Bool
ascendingOrder = Maybe Bool
a} :: ListOutgoingCertificates)

-- | The marker for the next set of results.
listOutgoingCertificates_marker :: Lens.Lens' ListOutgoingCertificates (Prelude.Maybe Prelude.Text)
listOutgoingCertificates_marker :: Lens' ListOutgoingCertificates (Maybe Text)
listOutgoingCertificates_marker = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListOutgoingCertificates' {Maybe Text
marker :: Maybe Text
$sel:marker:ListOutgoingCertificates' :: ListOutgoingCertificates -> Maybe Text
marker} -> Maybe Text
marker) (\s :: ListOutgoingCertificates
s@ListOutgoingCertificates' {} Maybe Text
a -> ListOutgoingCertificates
s {$sel:marker:ListOutgoingCertificates' :: Maybe Text
marker = Maybe Text
a} :: ListOutgoingCertificates)

-- | The result page size.
listOutgoingCertificates_pageSize :: Lens.Lens' ListOutgoingCertificates (Prelude.Maybe Prelude.Natural)
listOutgoingCertificates_pageSize :: Lens' ListOutgoingCertificates (Maybe Natural)
listOutgoingCertificates_pageSize = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListOutgoingCertificates' {Maybe Natural
pageSize :: Maybe Natural
$sel:pageSize:ListOutgoingCertificates' :: ListOutgoingCertificates -> Maybe Natural
pageSize} -> Maybe Natural
pageSize) (\s :: ListOutgoingCertificates
s@ListOutgoingCertificates' {} Maybe Natural
a -> ListOutgoingCertificates
s {$sel:pageSize:ListOutgoingCertificates' :: Maybe Natural
pageSize = Maybe Natural
a} :: ListOutgoingCertificates)

instance Core.AWSPager ListOutgoingCertificates where
  page :: ListOutgoingCertificates
-> AWSResponse ListOutgoingCertificates
-> Maybe ListOutgoingCertificates
page ListOutgoingCertificates
rq AWSResponse ListOutgoingCertificates
rs
    | forall a. AWSTruncated a => a -> Bool
Core.stop
        ( AWSResponse ListOutgoingCertificates
rs
            forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' ListOutgoingCertificatesResponse (Maybe Text)
listOutgoingCertificatesResponse_nextMarker
            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 ListOutgoingCertificates
rs
            forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens'
  ListOutgoingCertificatesResponse (Maybe [OutgoingCertificate])
listOutgoingCertificatesResponse_outgoingCertificates
            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
    | Bool
Prelude.otherwise =
        forall a. a -> Maybe a
Prelude.Just
          forall a b. (a -> b) -> a -> b
Prelude.$ ListOutgoingCertificates
rq
          forall a b. a -> (a -> b) -> b
Prelude.& Lens' ListOutgoingCertificates (Maybe Text)
listOutgoingCertificates_marker
          forall s t a b. ASetter s t a b -> b -> s -> t
Lens..~ AWSResponse ListOutgoingCertificates
rs
          forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' ListOutgoingCertificatesResponse (Maybe Text)
listOutgoingCertificatesResponse_nextMarker
          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 ListOutgoingCertificates where
  type
    AWSResponse ListOutgoingCertificates =
      ListOutgoingCertificatesResponse
  request :: (Service -> Service)
-> ListOutgoingCertificates -> Request ListOutgoingCertificates
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 ListOutgoingCertificates
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse ListOutgoingCertificates)))
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 [OutgoingCertificate]
-> Int
-> ListOutgoingCertificatesResponse
ListOutgoingCertificatesResponse'
            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
"nextMarker")
            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
"outgoingCertificates"
                            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 ListOutgoingCertificates where
  hashWithSalt :: Int -> ListOutgoingCertificates -> Int
hashWithSalt Int
_salt ListOutgoingCertificates' {Maybe Bool
Maybe Natural
Maybe Text
pageSize :: Maybe Natural
marker :: Maybe Text
ascendingOrder :: Maybe Bool
$sel:pageSize:ListOutgoingCertificates' :: ListOutgoingCertificates -> Maybe Natural
$sel:marker:ListOutgoingCertificates' :: ListOutgoingCertificates -> Maybe Text
$sel:ascendingOrder:ListOutgoingCertificates' :: ListOutgoingCertificates -> Maybe Bool
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
ascendingOrder
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
marker
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
pageSize

instance Prelude.NFData ListOutgoingCertificates where
  rnf :: ListOutgoingCertificates -> ()
rnf ListOutgoingCertificates' {Maybe Bool
Maybe Natural
Maybe Text
pageSize :: Maybe Natural
marker :: Maybe Text
ascendingOrder :: Maybe Bool
$sel:pageSize:ListOutgoingCertificates' :: ListOutgoingCertificates -> Maybe Natural
$sel:marker:ListOutgoingCertificates' :: ListOutgoingCertificates -> Maybe Text
$sel:ascendingOrder:ListOutgoingCertificates' :: ListOutgoingCertificates -> Maybe Bool
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
ascendingOrder
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
marker
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
pageSize

instance Data.ToHeaders ListOutgoingCertificates where
  toHeaders :: ListOutgoingCertificates -> ResponseHeaders
toHeaders = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty

instance Data.ToPath ListOutgoingCertificates where
  toPath :: ListOutgoingCertificates -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/certificates-out-going"

instance Data.ToQuery ListOutgoingCertificates where
  toQuery :: ListOutgoingCertificates -> QueryString
toQuery ListOutgoingCertificates' {Maybe Bool
Maybe Natural
Maybe Text
pageSize :: Maybe Natural
marker :: Maybe Text
ascendingOrder :: Maybe Bool
$sel:pageSize:ListOutgoingCertificates' :: ListOutgoingCertificates -> Maybe Natural
$sel:marker:ListOutgoingCertificates' :: ListOutgoingCertificates -> Maybe Text
$sel:ascendingOrder:ListOutgoingCertificates' :: ListOutgoingCertificates -> Maybe Bool
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"isAscendingOrder" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Bool
ascendingOrder,
        ByteString
"marker" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
marker,
        ByteString
"pageSize" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Natural
pageSize
      ]

-- | The output from the ListOutgoingCertificates operation.
--
-- /See:/ 'newListOutgoingCertificatesResponse' smart constructor.
data ListOutgoingCertificatesResponse = ListOutgoingCertificatesResponse'
  { -- | The marker for the next set of results.
    ListOutgoingCertificatesResponse -> Maybe Text
nextMarker :: Prelude.Maybe Prelude.Text,
    -- | The certificates that are being transferred but not yet accepted.
    ListOutgoingCertificatesResponse -> Maybe [OutgoingCertificate]
outgoingCertificates :: Prelude.Maybe [OutgoingCertificate],
    -- | The response's http status code.
    ListOutgoingCertificatesResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (ListOutgoingCertificatesResponse
-> ListOutgoingCertificatesResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListOutgoingCertificatesResponse
-> ListOutgoingCertificatesResponse -> Bool
$c/= :: ListOutgoingCertificatesResponse
-> ListOutgoingCertificatesResponse -> Bool
== :: ListOutgoingCertificatesResponse
-> ListOutgoingCertificatesResponse -> Bool
$c== :: ListOutgoingCertificatesResponse
-> ListOutgoingCertificatesResponse -> Bool
Prelude.Eq, ReadPrec [ListOutgoingCertificatesResponse]
ReadPrec ListOutgoingCertificatesResponse
Int -> ReadS ListOutgoingCertificatesResponse
ReadS [ListOutgoingCertificatesResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListOutgoingCertificatesResponse]
$creadListPrec :: ReadPrec [ListOutgoingCertificatesResponse]
readPrec :: ReadPrec ListOutgoingCertificatesResponse
$creadPrec :: ReadPrec ListOutgoingCertificatesResponse
readList :: ReadS [ListOutgoingCertificatesResponse]
$creadList :: ReadS [ListOutgoingCertificatesResponse]
readsPrec :: Int -> ReadS ListOutgoingCertificatesResponse
$creadsPrec :: Int -> ReadS ListOutgoingCertificatesResponse
Prelude.Read, Int -> ListOutgoingCertificatesResponse -> ShowS
[ListOutgoingCertificatesResponse] -> ShowS
ListOutgoingCertificatesResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListOutgoingCertificatesResponse] -> ShowS
$cshowList :: [ListOutgoingCertificatesResponse] -> ShowS
show :: ListOutgoingCertificatesResponse -> String
$cshow :: ListOutgoingCertificatesResponse -> String
showsPrec :: Int -> ListOutgoingCertificatesResponse -> ShowS
$cshowsPrec :: Int -> ListOutgoingCertificatesResponse -> ShowS
Prelude.Show, forall x.
Rep ListOutgoingCertificatesResponse x
-> ListOutgoingCertificatesResponse
forall x.
ListOutgoingCertificatesResponse
-> Rep ListOutgoingCertificatesResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep ListOutgoingCertificatesResponse x
-> ListOutgoingCertificatesResponse
$cfrom :: forall x.
ListOutgoingCertificatesResponse
-> Rep ListOutgoingCertificatesResponse x
Prelude.Generic)

-- |
-- Create a value of 'ListOutgoingCertificatesResponse' 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:
--
-- 'nextMarker', 'listOutgoingCertificatesResponse_nextMarker' - The marker for the next set of results.
--
-- 'outgoingCertificates', 'listOutgoingCertificatesResponse_outgoingCertificates' - The certificates that are being transferred but not yet accepted.
--
-- 'httpStatus', 'listOutgoingCertificatesResponse_httpStatus' - The response's http status code.
newListOutgoingCertificatesResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  ListOutgoingCertificatesResponse
newListOutgoingCertificatesResponse :: Int -> ListOutgoingCertificatesResponse
newListOutgoingCertificatesResponse Int
pHttpStatus_ =
  ListOutgoingCertificatesResponse'
    { $sel:nextMarker:ListOutgoingCertificatesResponse' :: Maybe Text
nextMarker =
        forall a. Maybe a
Prelude.Nothing,
      $sel:outgoingCertificates:ListOutgoingCertificatesResponse' :: Maybe [OutgoingCertificate]
outgoingCertificates = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:ListOutgoingCertificatesResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The marker for the next set of results.
listOutgoingCertificatesResponse_nextMarker :: Lens.Lens' ListOutgoingCertificatesResponse (Prelude.Maybe Prelude.Text)
listOutgoingCertificatesResponse_nextMarker :: Lens' ListOutgoingCertificatesResponse (Maybe Text)
listOutgoingCertificatesResponse_nextMarker = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListOutgoingCertificatesResponse' {Maybe Text
nextMarker :: Maybe Text
$sel:nextMarker:ListOutgoingCertificatesResponse' :: ListOutgoingCertificatesResponse -> Maybe Text
nextMarker} -> Maybe Text
nextMarker) (\s :: ListOutgoingCertificatesResponse
s@ListOutgoingCertificatesResponse' {} Maybe Text
a -> ListOutgoingCertificatesResponse
s {$sel:nextMarker:ListOutgoingCertificatesResponse' :: Maybe Text
nextMarker = Maybe Text
a} :: ListOutgoingCertificatesResponse)

-- | The certificates that are being transferred but not yet accepted.
listOutgoingCertificatesResponse_outgoingCertificates :: Lens.Lens' ListOutgoingCertificatesResponse (Prelude.Maybe [OutgoingCertificate])
listOutgoingCertificatesResponse_outgoingCertificates :: Lens'
  ListOutgoingCertificatesResponse (Maybe [OutgoingCertificate])
listOutgoingCertificatesResponse_outgoingCertificates = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListOutgoingCertificatesResponse' {Maybe [OutgoingCertificate]
outgoingCertificates :: Maybe [OutgoingCertificate]
$sel:outgoingCertificates:ListOutgoingCertificatesResponse' :: ListOutgoingCertificatesResponse -> Maybe [OutgoingCertificate]
outgoingCertificates} -> Maybe [OutgoingCertificate]
outgoingCertificates) (\s :: ListOutgoingCertificatesResponse
s@ListOutgoingCertificatesResponse' {} Maybe [OutgoingCertificate]
a -> ListOutgoingCertificatesResponse
s {$sel:outgoingCertificates:ListOutgoingCertificatesResponse' :: Maybe [OutgoingCertificate]
outgoingCertificates = Maybe [OutgoingCertificate]
a} :: ListOutgoingCertificatesResponse) 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.
listOutgoingCertificatesResponse_httpStatus :: Lens.Lens' ListOutgoingCertificatesResponse Prelude.Int
listOutgoingCertificatesResponse_httpStatus :: Lens' ListOutgoingCertificatesResponse Int
listOutgoingCertificatesResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListOutgoingCertificatesResponse' {Int
httpStatus :: Int
$sel:httpStatus:ListOutgoingCertificatesResponse' :: ListOutgoingCertificatesResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: ListOutgoingCertificatesResponse
s@ListOutgoingCertificatesResponse' {} Int
a -> ListOutgoingCertificatesResponse
s {$sel:httpStatus:ListOutgoingCertificatesResponse' :: Int
httpStatus = Int
a} :: ListOutgoingCertificatesResponse)

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