{-# 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 #-}
module Amazonka.CloudFront.ListCloudFrontOriginAccessIdentities
(
ListCloudFrontOriginAccessIdentities (..),
newListCloudFrontOriginAccessIdentities,
listCloudFrontOriginAccessIdentities_marker,
listCloudFrontOriginAccessIdentities_maxItems,
ListCloudFrontOriginAccessIdentitiesResponse (..),
newListCloudFrontOriginAccessIdentitiesResponse,
listCloudFrontOriginAccessIdentitiesResponse_httpStatus,
listCloudFrontOriginAccessIdentitiesResponse_cloudFrontOriginAccessIdentityList,
)
where
import Amazonka.CloudFront.Types
import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response
data ListCloudFrontOriginAccessIdentities = ListCloudFrontOriginAccessIdentities'
{
ListCloudFrontOriginAccessIdentities -> Maybe Text
marker :: Prelude.Maybe Prelude.Text,
ListCloudFrontOriginAccessIdentities -> Maybe Text
maxItems :: Prelude.Maybe Prelude.Text
}
deriving (ListCloudFrontOriginAccessIdentities
-> ListCloudFrontOriginAccessIdentities -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListCloudFrontOriginAccessIdentities
-> ListCloudFrontOriginAccessIdentities -> Bool
$c/= :: ListCloudFrontOriginAccessIdentities
-> ListCloudFrontOriginAccessIdentities -> Bool
== :: ListCloudFrontOriginAccessIdentities
-> ListCloudFrontOriginAccessIdentities -> Bool
$c== :: ListCloudFrontOriginAccessIdentities
-> ListCloudFrontOriginAccessIdentities -> Bool
Prelude.Eq, ReadPrec [ListCloudFrontOriginAccessIdentities]
ReadPrec ListCloudFrontOriginAccessIdentities
Int -> ReadS ListCloudFrontOriginAccessIdentities
ReadS [ListCloudFrontOriginAccessIdentities]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListCloudFrontOriginAccessIdentities]
$creadListPrec :: ReadPrec [ListCloudFrontOriginAccessIdentities]
readPrec :: ReadPrec ListCloudFrontOriginAccessIdentities
$creadPrec :: ReadPrec ListCloudFrontOriginAccessIdentities
readList :: ReadS [ListCloudFrontOriginAccessIdentities]
$creadList :: ReadS [ListCloudFrontOriginAccessIdentities]
readsPrec :: Int -> ReadS ListCloudFrontOriginAccessIdentities
$creadsPrec :: Int -> ReadS ListCloudFrontOriginAccessIdentities
Prelude.Read, Int -> ListCloudFrontOriginAccessIdentities -> ShowS
[ListCloudFrontOriginAccessIdentities] -> ShowS
ListCloudFrontOriginAccessIdentities -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListCloudFrontOriginAccessIdentities] -> ShowS
$cshowList :: [ListCloudFrontOriginAccessIdentities] -> ShowS
show :: ListCloudFrontOriginAccessIdentities -> String
$cshow :: ListCloudFrontOriginAccessIdentities -> String
showsPrec :: Int -> ListCloudFrontOriginAccessIdentities -> ShowS
$cshowsPrec :: Int -> ListCloudFrontOriginAccessIdentities -> ShowS
Prelude.Show, forall x.
Rep ListCloudFrontOriginAccessIdentities x
-> ListCloudFrontOriginAccessIdentities
forall x.
ListCloudFrontOriginAccessIdentities
-> Rep ListCloudFrontOriginAccessIdentities x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep ListCloudFrontOriginAccessIdentities x
-> ListCloudFrontOriginAccessIdentities
$cfrom :: forall x.
ListCloudFrontOriginAccessIdentities
-> Rep ListCloudFrontOriginAccessIdentities x
Prelude.Generic)
newListCloudFrontOriginAccessIdentities ::
ListCloudFrontOriginAccessIdentities
newListCloudFrontOriginAccessIdentities :: ListCloudFrontOriginAccessIdentities
newListCloudFrontOriginAccessIdentities =
ListCloudFrontOriginAccessIdentities'
{ $sel:marker:ListCloudFrontOriginAccessIdentities' :: Maybe Text
marker =
forall a. Maybe a
Prelude.Nothing,
$sel:maxItems:ListCloudFrontOriginAccessIdentities' :: Maybe Text
maxItems = forall a. Maybe a
Prelude.Nothing
}
listCloudFrontOriginAccessIdentities_marker :: Lens.Lens' ListCloudFrontOriginAccessIdentities (Prelude.Maybe Prelude.Text)
listCloudFrontOriginAccessIdentities_marker :: Lens' ListCloudFrontOriginAccessIdentities (Maybe Text)
listCloudFrontOriginAccessIdentities_marker = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListCloudFrontOriginAccessIdentities' {Maybe Text
marker :: Maybe Text
$sel:marker:ListCloudFrontOriginAccessIdentities' :: ListCloudFrontOriginAccessIdentities -> Maybe Text
marker} -> Maybe Text
marker) (\s :: ListCloudFrontOriginAccessIdentities
s@ListCloudFrontOriginAccessIdentities' {} Maybe Text
a -> ListCloudFrontOriginAccessIdentities
s {$sel:marker:ListCloudFrontOriginAccessIdentities' :: Maybe Text
marker = Maybe Text
a} :: ListCloudFrontOriginAccessIdentities)
listCloudFrontOriginAccessIdentities_maxItems :: Lens.Lens' ListCloudFrontOriginAccessIdentities (Prelude.Maybe Prelude.Text)
listCloudFrontOriginAccessIdentities_maxItems :: Lens' ListCloudFrontOriginAccessIdentities (Maybe Text)
listCloudFrontOriginAccessIdentities_maxItems = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListCloudFrontOriginAccessIdentities' {Maybe Text
maxItems :: Maybe Text
$sel:maxItems:ListCloudFrontOriginAccessIdentities' :: ListCloudFrontOriginAccessIdentities -> Maybe Text
maxItems} -> Maybe Text
maxItems) (\s :: ListCloudFrontOriginAccessIdentities
s@ListCloudFrontOriginAccessIdentities' {} Maybe Text
a -> ListCloudFrontOriginAccessIdentities
s {$sel:maxItems:ListCloudFrontOriginAccessIdentities' :: Maybe Text
maxItems = Maybe Text
a} :: ListCloudFrontOriginAccessIdentities)
instance
Core.AWSPager
ListCloudFrontOriginAccessIdentities
where
page :: ListCloudFrontOriginAccessIdentities
-> AWSResponse ListCloudFrontOriginAccessIdentities
-> Maybe ListCloudFrontOriginAccessIdentities
page ListCloudFrontOriginAccessIdentities
rq AWSResponse ListCloudFrontOriginAccessIdentities
rs
| forall a. AWSTruncated a => a -> Bool
Core.stop
( AWSResponse ListCloudFrontOriginAccessIdentities
rs
forall s a. s -> Getting a s a -> a
Lens.^. Lens'
ListCloudFrontOriginAccessIdentitiesResponse
CloudFrontOriginAccessIdentityList
listCloudFrontOriginAccessIdentitiesResponse_cloudFrontOriginAccessIdentityList
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. Lens' CloudFrontOriginAccessIdentityList Bool
cloudFrontOriginAccessIdentityList_isTruncated
) =
forall a. Maybe a
Prelude.Nothing
| forall a. Maybe a -> Bool
Prelude.isNothing
( AWSResponse ListCloudFrontOriginAccessIdentities
rs
forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens'
ListCloudFrontOriginAccessIdentitiesResponse
CloudFrontOriginAccessIdentityList
listCloudFrontOriginAccessIdentitiesResponse_cloudFrontOriginAccessIdentityList
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. Lens' CloudFrontOriginAccessIdentityList (Maybe Text)
cloudFrontOriginAccessIdentityList_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
| Bool
Prelude.otherwise =
forall a. a -> Maybe a
Prelude.Just
forall a b. (a -> b) -> a -> b
Prelude.$ ListCloudFrontOriginAccessIdentities
rq
forall a b. a -> (a -> b) -> b
Prelude.& Lens' ListCloudFrontOriginAccessIdentities (Maybe Text)
listCloudFrontOriginAccessIdentities_marker
forall s t a b. ASetter s t a b -> b -> s -> t
Lens..~ AWSResponse ListCloudFrontOriginAccessIdentities
rs
forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens'
ListCloudFrontOriginAccessIdentitiesResponse
CloudFrontOriginAccessIdentityList
listCloudFrontOriginAccessIdentitiesResponse_cloudFrontOriginAccessIdentityList
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. Lens' CloudFrontOriginAccessIdentityList (Maybe Text)
cloudFrontOriginAccessIdentityList_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
ListCloudFrontOriginAccessIdentities
where
type
AWSResponse ListCloudFrontOriginAccessIdentities =
ListCloudFrontOriginAccessIdentitiesResponse
request :: (Service -> Service)
-> ListCloudFrontOriginAccessIdentities
-> Request ListCloudFrontOriginAccessIdentities
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 ListCloudFrontOriginAccessIdentities
-> ClientResponse ClientBody
-> m (Either
Error
(ClientResponse
(AWSResponse ListCloudFrontOriginAccessIdentities)))
response =
forall (m :: * -> *) a.
MonadResource m =>
(Int -> ResponseHeaders -> [Node] -> Either String (AWSResponse a))
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveXML
( \Int
s ResponseHeaders
h [Node]
x ->
Int
-> CloudFrontOriginAccessIdentityList
-> ListCloudFrontOriginAccessIdentitiesResponse
ListCloudFrontOriginAccessIdentitiesResponse'
forall (f :: * -> *) a b. Functor 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.<*> (forall a. FromXML a => [Node] -> Either String a
Data.parseXML [Node]
x)
)
instance
Prelude.Hashable
ListCloudFrontOriginAccessIdentities
where
hashWithSalt :: Int -> ListCloudFrontOriginAccessIdentities -> Int
hashWithSalt
Int
_salt
ListCloudFrontOriginAccessIdentities' {Maybe Text
maxItems :: Maybe Text
marker :: Maybe Text
$sel:maxItems:ListCloudFrontOriginAccessIdentities' :: ListCloudFrontOriginAccessIdentities -> Maybe Text
$sel:marker:ListCloudFrontOriginAccessIdentities' :: ListCloudFrontOriginAccessIdentities -> Maybe Text
..} =
Int
_salt
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
marker
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
maxItems
instance
Prelude.NFData
ListCloudFrontOriginAccessIdentities
where
rnf :: ListCloudFrontOriginAccessIdentities -> ()
rnf ListCloudFrontOriginAccessIdentities' {Maybe Text
maxItems :: Maybe Text
marker :: Maybe Text
$sel:maxItems:ListCloudFrontOriginAccessIdentities' :: ListCloudFrontOriginAccessIdentities -> Maybe Text
$sel:marker:ListCloudFrontOriginAccessIdentities' :: ListCloudFrontOriginAccessIdentities -> Maybe Text
..} =
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 Text
maxItems
instance
Data.ToHeaders
ListCloudFrontOriginAccessIdentities
where
toHeaders :: ListCloudFrontOriginAccessIdentities -> ResponseHeaders
toHeaders = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty
instance
Data.ToPath
ListCloudFrontOriginAccessIdentities
where
toPath :: ListCloudFrontOriginAccessIdentities -> ByteString
toPath =
forall a b. a -> b -> a
Prelude.const
ByteString
"/2020-05-31/origin-access-identity/cloudfront"
instance
Data.ToQuery
ListCloudFrontOriginAccessIdentities
where
toQuery :: ListCloudFrontOriginAccessIdentities -> QueryString
toQuery ListCloudFrontOriginAccessIdentities' {Maybe Text
maxItems :: Maybe Text
marker :: Maybe Text
$sel:maxItems:ListCloudFrontOriginAccessIdentities' :: ListCloudFrontOriginAccessIdentities -> Maybe Text
$sel:marker:ListCloudFrontOriginAccessIdentities' :: ListCloudFrontOriginAccessIdentities -> Maybe Text
..} =
forall a. Monoid a => [a] -> a
Prelude.mconcat
[ ByteString
"Marker" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
marker,
ByteString
"MaxItems" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
maxItems
]
data ListCloudFrontOriginAccessIdentitiesResponse = ListCloudFrontOriginAccessIdentitiesResponse'
{
ListCloudFrontOriginAccessIdentitiesResponse -> Int
httpStatus :: Prelude.Int,
ListCloudFrontOriginAccessIdentitiesResponse
-> CloudFrontOriginAccessIdentityList
cloudFrontOriginAccessIdentityList :: CloudFrontOriginAccessIdentityList
}
deriving (ListCloudFrontOriginAccessIdentitiesResponse
-> ListCloudFrontOriginAccessIdentitiesResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListCloudFrontOriginAccessIdentitiesResponse
-> ListCloudFrontOriginAccessIdentitiesResponse -> Bool
$c/= :: ListCloudFrontOriginAccessIdentitiesResponse
-> ListCloudFrontOriginAccessIdentitiesResponse -> Bool
== :: ListCloudFrontOriginAccessIdentitiesResponse
-> ListCloudFrontOriginAccessIdentitiesResponse -> Bool
$c== :: ListCloudFrontOriginAccessIdentitiesResponse
-> ListCloudFrontOriginAccessIdentitiesResponse -> Bool
Prelude.Eq, ReadPrec [ListCloudFrontOriginAccessIdentitiesResponse]
ReadPrec ListCloudFrontOriginAccessIdentitiesResponse
Int -> ReadS ListCloudFrontOriginAccessIdentitiesResponse
ReadS [ListCloudFrontOriginAccessIdentitiesResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListCloudFrontOriginAccessIdentitiesResponse]
$creadListPrec :: ReadPrec [ListCloudFrontOriginAccessIdentitiesResponse]
readPrec :: ReadPrec ListCloudFrontOriginAccessIdentitiesResponse
$creadPrec :: ReadPrec ListCloudFrontOriginAccessIdentitiesResponse
readList :: ReadS [ListCloudFrontOriginAccessIdentitiesResponse]
$creadList :: ReadS [ListCloudFrontOriginAccessIdentitiesResponse]
readsPrec :: Int -> ReadS ListCloudFrontOriginAccessIdentitiesResponse
$creadsPrec :: Int -> ReadS ListCloudFrontOriginAccessIdentitiesResponse
Prelude.Read, Int -> ListCloudFrontOriginAccessIdentitiesResponse -> ShowS
[ListCloudFrontOriginAccessIdentitiesResponse] -> ShowS
ListCloudFrontOriginAccessIdentitiesResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListCloudFrontOriginAccessIdentitiesResponse] -> ShowS
$cshowList :: [ListCloudFrontOriginAccessIdentitiesResponse] -> ShowS
show :: ListCloudFrontOriginAccessIdentitiesResponse -> String
$cshow :: ListCloudFrontOriginAccessIdentitiesResponse -> String
showsPrec :: Int -> ListCloudFrontOriginAccessIdentitiesResponse -> ShowS
$cshowsPrec :: Int -> ListCloudFrontOriginAccessIdentitiesResponse -> ShowS
Prelude.Show, forall x.
Rep ListCloudFrontOriginAccessIdentitiesResponse x
-> ListCloudFrontOriginAccessIdentitiesResponse
forall x.
ListCloudFrontOriginAccessIdentitiesResponse
-> Rep ListCloudFrontOriginAccessIdentitiesResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep ListCloudFrontOriginAccessIdentitiesResponse x
-> ListCloudFrontOriginAccessIdentitiesResponse
$cfrom :: forall x.
ListCloudFrontOriginAccessIdentitiesResponse
-> Rep ListCloudFrontOriginAccessIdentitiesResponse x
Prelude.Generic)
newListCloudFrontOriginAccessIdentitiesResponse ::
Prelude.Int ->
CloudFrontOriginAccessIdentityList ->
ListCloudFrontOriginAccessIdentitiesResponse
newListCloudFrontOriginAccessIdentitiesResponse :: Int
-> CloudFrontOriginAccessIdentityList
-> ListCloudFrontOriginAccessIdentitiesResponse
newListCloudFrontOriginAccessIdentitiesResponse
Int
pHttpStatus_
CloudFrontOriginAccessIdentityList
pCloudFrontOriginAccessIdentityList_ =
ListCloudFrontOriginAccessIdentitiesResponse'
{ $sel:httpStatus:ListCloudFrontOriginAccessIdentitiesResponse' :: Int
httpStatus =
Int
pHttpStatus_,
$sel:cloudFrontOriginAccessIdentityList:ListCloudFrontOriginAccessIdentitiesResponse' :: CloudFrontOriginAccessIdentityList
cloudFrontOriginAccessIdentityList =
CloudFrontOriginAccessIdentityList
pCloudFrontOriginAccessIdentityList_
}
listCloudFrontOriginAccessIdentitiesResponse_httpStatus :: Lens.Lens' ListCloudFrontOriginAccessIdentitiesResponse Prelude.Int
listCloudFrontOriginAccessIdentitiesResponse_httpStatus :: Lens' ListCloudFrontOriginAccessIdentitiesResponse Int
listCloudFrontOriginAccessIdentitiesResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListCloudFrontOriginAccessIdentitiesResponse' {Int
httpStatus :: Int
$sel:httpStatus:ListCloudFrontOriginAccessIdentitiesResponse' :: ListCloudFrontOriginAccessIdentitiesResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: ListCloudFrontOriginAccessIdentitiesResponse
s@ListCloudFrontOriginAccessIdentitiesResponse' {} Int
a -> ListCloudFrontOriginAccessIdentitiesResponse
s {$sel:httpStatus:ListCloudFrontOriginAccessIdentitiesResponse' :: Int
httpStatus = Int
a} :: ListCloudFrontOriginAccessIdentitiesResponse)
listCloudFrontOriginAccessIdentitiesResponse_cloudFrontOriginAccessIdentityList :: Lens.Lens' ListCloudFrontOriginAccessIdentitiesResponse CloudFrontOriginAccessIdentityList
listCloudFrontOriginAccessIdentitiesResponse_cloudFrontOriginAccessIdentityList :: Lens'
ListCloudFrontOriginAccessIdentitiesResponse
CloudFrontOriginAccessIdentityList
listCloudFrontOriginAccessIdentitiesResponse_cloudFrontOriginAccessIdentityList = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListCloudFrontOriginAccessIdentitiesResponse' {CloudFrontOriginAccessIdentityList
cloudFrontOriginAccessIdentityList :: CloudFrontOriginAccessIdentityList
$sel:cloudFrontOriginAccessIdentityList:ListCloudFrontOriginAccessIdentitiesResponse' :: ListCloudFrontOriginAccessIdentitiesResponse
-> CloudFrontOriginAccessIdentityList
cloudFrontOriginAccessIdentityList} -> CloudFrontOriginAccessIdentityList
cloudFrontOriginAccessIdentityList) (\s :: ListCloudFrontOriginAccessIdentitiesResponse
s@ListCloudFrontOriginAccessIdentitiesResponse' {} CloudFrontOriginAccessIdentityList
a -> ListCloudFrontOriginAccessIdentitiesResponse
s {$sel:cloudFrontOriginAccessIdentityList:ListCloudFrontOriginAccessIdentitiesResponse' :: CloudFrontOriginAccessIdentityList
cloudFrontOriginAccessIdentityList = CloudFrontOriginAccessIdentityList
a} :: ListCloudFrontOriginAccessIdentitiesResponse)
instance
Prelude.NFData
ListCloudFrontOriginAccessIdentitiesResponse
where
rnf :: ListCloudFrontOriginAccessIdentitiesResponse -> ()
rnf ListCloudFrontOriginAccessIdentitiesResponse' {Int
CloudFrontOriginAccessIdentityList
cloudFrontOriginAccessIdentityList :: CloudFrontOriginAccessIdentityList
httpStatus :: Int
$sel:cloudFrontOriginAccessIdentityList:ListCloudFrontOriginAccessIdentitiesResponse' :: ListCloudFrontOriginAccessIdentitiesResponse
-> CloudFrontOriginAccessIdentityList
$sel:httpStatus:ListCloudFrontOriginAccessIdentitiesResponse' :: ListCloudFrontOriginAccessIdentitiesResponse -> Int
..} =
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 CloudFrontOriginAccessIdentityList
cloudFrontOriginAccessIdentityList