{-# 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.WorkDocs.DescribeGroups
(
DescribeGroups (..),
newDescribeGroups,
describeGroups_authenticationToken,
describeGroups_limit,
describeGroups_marker,
describeGroups_organizationId,
describeGroups_searchQuery,
DescribeGroupsResponse (..),
newDescribeGroupsResponse,
describeGroupsResponse_groups,
describeGroupsResponse_marker,
describeGroupsResponse_httpStatus,
)
where
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
import Amazonka.WorkDocs.Types
data DescribeGroups = DescribeGroups'
{
DescribeGroups -> Maybe (Sensitive Text)
authenticationToken :: Prelude.Maybe (Data.Sensitive Prelude.Text),
DescribeGroups -> Maybe Natural
limit :: Prelude.Maybe Prelude.Natural,
DescribeGroups -> Maybe Text
marker :: Prelude.Maybe Prelude.Text,
DescribeGroups -> Maybe Text
organizationId :: Prelude.Maybe Prelude.Text,
DescribeGroups -> Sensitive Text
searchQuery :: Data.Sensitive Prelude.Text
}
deriving (DescribeGroups -> DescribeGroups -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeGroups -> DescribeGroups -> Bool
$c/= :: DescribeGroups -> DescribeGroups -> Bool
== :: DescribeGroups -> DescribeGroups -> Bool
$c== :: DescribeGroups -> DescribeGroups -> Bool
Prelude.Eq, Int -> DescribeGroups -> ShowS
[DescribeGroups] -> ShowS
DescribeGroups -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeGroups] -> ShowS
$cshowList :: [DescribeGroups] -> ShowS
show :: DescribeGroups -> String
$cshow :: DescribeGroups -> String
showsPrec :: Int -> DescribeGroups -> ShowS
$cshowsPrec :: Int -> DescribeGroups -> ShowS
Prelude.Show, forall x. Rep DescribeGroups x -> DescribeGroups
forall x. DescribeGroups -> Rep DescribeGroups x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DescribeGroups x -> DescribeGroups
$cfrom :: forall x. DescribeGroups -> Rep DescribeGroups x
Prelude.Generic)
newDescribeGroups ::
Prelude.Text ->
DescribeGroups
newDescribeGroups :: Text -> DescribeGroups
newDescribeGroups Text
pSearchQuery_ =
DescribeGroups'
{ $sel:authenticationToken:DescribeGroups' :: Maybe (Sensitive Text)
authenticationToken =
forall a. Maybe a
Prelude.Nothing,
$sel:limit:DescribeGroups' :: Maybe Natural
limit = forall a. Maybe a
Prelude.Nothing,
$sel:marker:DescribeGroups' :: Maybe Text
marker = forall a. Maybe a
Prelude.Nothing,
$sel:organizationId:DescribeGroups' :: Maybe Text
organizationId = forall a. Maybe a
Prelude.Nothing,
$sel:searchQuery:DescribeGroups' :: Sensitive Text
searchQuery = forall a. Iso' (Sensitive a) a
Data._Sensitive forall t b. AReview t b -> b -> t
Lens.# Text
pSearchQuery_
}
describeGroups_authenticationToken :: Lens.Lens' DescribeGroups (Prelude.Maybe Prelude.Text)
describeGroups_authenticationToken :: Lens' DescribeGroups (Maybe Text)
describeGroups_authenticationToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeGroups' {Maybe (Sensitive Text)
authenticationToken :: Maybe (Sensitive Text)
$sel:authenticationToken:DescribeGroups' :: DescribeGroups -> Maybe (Sensitive Text)
authenticationToken} -> Maybe (Sensitive Text)
authenticationToken) (\s :: DescribeGroups
s@DescribeGroups' {} Maybe (Sensitive Text)
a -> DescribeGroups
s {$sel:authenticationToken:DescribeGroups' :: Maybe (Sensitive Text)
authenticationToken = Maybe (Sensitive Text)
a} :: DescribeGroups) 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 a. Iso' (Sensitive a) a
Data._Sensitive
describeGroups_limit :: Lens.Lens' DescribeGroups (Prelude.Maybe Prelude.Natural)
describeGroups_limit :: Lens' DescribeGroups (Maybe Natural)
describeGroups_limit = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeGroups' {Maybe Natural
limit :: Maybe Natural
$sel:limit:DescribeGroups' :: DescribeGroups -> Maybe Natural
limit} -> Maybe Natural
limit) (\s :: DescribeGroups
s@DescribeGroups' {} Maybe Natural
a -> DescribeGroups
s {$sel:limit:DescribeGroups' :: Maybe Natural
limit = Maybe Natural
a} :: DescribeGroups)
describeGroups_marker :: Lens.Lens' DescribeGroups (Prelude.Maybe Prelude.Text)
describeGroups_marker :: Lens' DescribeGroups (Maybe Text)
describeGroups_marker = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeGroups' {Maybe Text
marker :: Maybe Text
$sel:marker:DescribeGroups' :: DescribeGroups -> Maybe Text
marker} -> Maybe Text
marker) (\s :: DescribeGroups
s@DescribeGroups' {} Maybe Text
a -> DescribeGroups
s {$sel:marker:DescribeGroups' :: Maybe Text
marker = Maybe Text
a} :: DescribeGroups)
describeGroups_organizationId :: Lens.Lens' DescribeGroups (Prelude.Maybe Prelude.Text)
describeGroups_organizationId :: Lens' DescribeGroups (Maybe Text)
describeGroups_organizationId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeGroups' {Maybe Text
organizationId :: Maybe Text
$sel:organizationId:DescribeGroups' :: DescribeGroups -> Maybe Text
organizationId} -> Maybe Text
organizationId) (\s :: DescribeGroups
s@DescribeGroups' {} Maybe Text
a -> DescribeGroups
s {$sel:organizationId:DescribeGroups' :: Maybe Text
organizationId = Maybe Text
a} :: DescribeGroups)
describeGroups_searchQuery :: Lens.Lens' DescribeGroups Prelude.Text
describeGroups_searchQuery :: Lens' DescribeGroups Text
describeGroups_searchQuery = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeGroups' {Sensitive Text
searchQuery :: Sensitive Text
$sel:searchQuery:DescribeGroups' :: DescribeGroups -> Sensitive Text
searchQuery} -> Sensitive Text
searchQuery) (\s :: DescribeGroups
s@DescribeGroups' {} Sensitive Text
a -> DescribeGroups
s {$sel:searchQuery:DescribeGroups' :: Sensitive Text
searchQuery = Sensitive Text
a} :: DescribeGroups) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall a. Iso' (Sensitive a) a
Data._Sensitive
instance Core.AWSPager DescribeGroups where
page :: DescribeGroups
-> AWSResponse DescribeGroups -> Maybe DescribeGroups
page DescribeGroups
rq AWSResponse DescribeGroups
rs
| forall a. AWSTruncated a => a -> Bool
Core.stop
( AWSResponse DescribeGroups
rs
forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' DescribeGroupsResponse (Maybe Text)
describeGroupsResponse_marker
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 DescribeGroups
rs
forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' DescribeGroupsResponse (Maybe [GroupMetadata])
describeGroupsResponse_groups
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.$ DescribeGroups
rq
forall a b. a -> (a -> b) -> b
Prelude.& Lens' DescribeGroups (Maybe Text)
describeGroups_marker
forall s t a b. ASetter s t a b -> b -> s -> t
Lens..~ AWSResponse DescribeGroups
rs
forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' DescribeGroupsResponse (Maybe Text)
describeGroupsResponse_marker
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 DescribeGroups where
type
AWSResponse DescribeGroups =
DescribeGroupsResponse
request :: (Service -> Service) -> DescribeGroups -> Request DescribeGroups
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 DescribeGroups
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse DescribeGroups)))
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 [GroupMetadata]
-> Maybe Text -> Int -> DescribeGroupsResponse
DescribeGroupsResponse'
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
"Groups" 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
"Marker")
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 DescribeGroups where
hashWithSalt :: Int -> DescribeGroups -> Int
hashWithSalt Int
_salt DescribeGroups' {Maybe Natural
Maybe Text
Maybe (Sensitive Text)
Sensitive Text
searchQuery :: Sensitive Text
organizationId :: Maybe Text
marker :: Maybe Text
limit :: Maybe Natural
authenticationToken :: Maybe (Sensitive Text)
$sel:searchQuery:DescribeGroups' :: DescribeGroups -> Sensitive Text
$sel:organizationId:DescribeGroups' :: DescribeGroups -> Maybe Text
$sel:marker:DescribeGroups' :: DescribeGroups -> Maybe Text
$sel:limit:DescribeGroups' :: DescribeGroups -> Maybe Natural
$sel:authenticationToken:DescribeGroups' :: DescribeGroups -> Maybe (Sensitive Text)
..} =
Int
_salt
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe (Sensitive Text)
authenticationToken
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
limit
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
marker
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
organizationId
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Sensitive Text
searchQuery
instance Prelude.NFData DescribeGroups where
rnf :: DescribeGroups -> ()
rnf DescribeGroups' {Maybe Natural
Maybe Text
Maybe (Sensitive Text)
Sensitive Text
searchQuery :: Sensitive Text
organizationId :: Maybe Text
marker :: Maybe Text
limit :: Maybe Natural
authenticationToken :: Maybe (Sensitive Text)
$sel:searchQuery:DescribeGroups' :: DescribeGroups -> Sensitive Text
$sel:organizationId:DescribeGroups' :: DescribeGroups -> Maybe Text
$sel:marker:DescribeGroups' :: DescribeGroups -> Maybe Text
$sel:limit:DescribeGroups' :: DescribeGroups -> Maybe Natural
$sel:authenticationToken:DescribeGroups' :: DescribeGroups -> Maybe (Sensitive Text)
..} =
forall a. NFData a => a -> ()
Prelude.rnf Maybe (Sensitive Text)
authenticationToken
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
limit
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 Text
organizationId
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Sensitive Text
searchQuery
instance Data.ToHeaders DescribeGroups where
toHeaders :: DescribeGroups -> ResponseHeaders
toHeaders DescribeGroups' {Maybe Natural
Maybe Text
Maybe (Sensitive Text)
Sensitive Text
searchQuery :: Sensitive Text
organizationId :: Maybe Text
marker :: Maybe Text
limit :: Maybe Natural
authenticationToken :: Maybe (Sensitive Text)
$sel:searchQuery:DescribeGroups' :: DescribeGroups -> Sensitive Text
$sel:organizationId:DescribeGroups' :: DescribeGroups -> Maybe Text
$sel:marker:DescribeGroups' :: DescribeGroups -> Maybe Text
$sel:limit:DescribeGroups' :: DescribeGroups -> Maybe Natural
$sel:authenticationToken:DescribeGroups' :: DescribeGroups -> Maybe (Sensitive Text)
..} =
forall a. Monoid a => [a] -> a
Prelude.mconcat
[ HeaderName
"Authentication" forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# Maybe (Sensitive Text)
authenticationToken,
HeaderName
"Content-Type"
forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# (ByteString
"application/x-amz-json-1.1" :: Prelude.ByteString)
]
instance Data.ToPath DescribeGroups where
toPath :: DescribeGroups -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/api/v1/groups"
instance Data.ToQuery DescribeGroups where
toQuery :: DescribeGroups -> QueryString
toQuery DescribeGroups' {Maybe Natural
Maybe Text
Maybe (Sensitive Text)
Sensitive Text
searchQuery :: Sensitive Text
organizationId :: Maybe Text
marker :: Maybe Text
limit :: Maybe Natural
authenticationToken :: Maybe (Sensitive Text)
$sel:searchQuery:DescribeGroups' :: DescribeGroups -> Sensitive Text
$sel:organizationId:DescribeGroups' :: DescribeGroups -> Maybe Text
$sel:marker:DescribeGroups' :: DescribeGroups -> Maybe Text
$sel:limit:DescribeGroups' :: DescribeGroups -> Maybe Natural
$sel:authenticationToken:DescribeGroups' :: DescribeGroups -> Maybe (Sensitive Text)
..} =
forall a. Monoid a => [a] -> a
Prelude.mconcat
[ ByteString
"limit" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Natural
limit,
ByteString
"marker" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
marker,
ByteString
"organizationId" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
organizationId,
ByteString
"searchQuery" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Sensitive Text
searchQuery
]
data DescribeGroupsResponse = DescribeGroupsResponse'
{
DescribeGroupsResponse -> Maybe [GroupMetadata]
groups :: Prelude.Maybe [GroupMetadata],
DescribeGroupsResponse -> Maybe Text
marker :: Prelude.Maybe Prelude.Text,
DescribeGroupsResponse -> Int
httpStatus :: Prelude.Int
}
deriving (DescribeGroupsResponse -> DescribeGroupsResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeGroupsResponse -> DescribeGroupsResponse -> Bool
$c/= :: DescribeGroupsResponse -> DescribeGroupsResponse -> Bool
== :: DescribeGroupsResponse -> DescribeGroupsResponse -> Bool
$c== :: DescribeGroupsResponse -> DescribeGroupsResponse -> Bool
Prelude.Eq, ReadPrec [DescribeGroupsResponse]
ReadPrec DescribeGroupsResponse
Int -> ReadS DescribeGroupsResponse
ReadS [DescribeGroupsResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeGroupsResponse]
$creadListPrec :: ReadPrec [DescribeGroupsResponse]
readPrec :: ReadPrec DescribeGroupsResponse
$creadPrec :: ReadPrec DescribeGroupsResponse
readList :: ReadS [DescribeGroupsResponse]
$creadList :: ReadS [DescribeGroupsResponse]
readsPrec :: Int -> ReadS DescribeGroupsResponse
$creadsPrec :: Int -> ReadS DescribeGroupsResponse
Prelude.Read, Int -> DescribeGroupsResponse -> ShowS
[DescribeGroupsResponse] -> ShowS
DescribeGroupsResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeGroupsResponse] -> ShowS
$cshowList :: [DescribeGroupsResponse] -> ShowS
show :: DescribeGroupsResponse -> String
$cshow :: DescribeGroupsResponse -> String
showsPrec :: Int -> DescribeGroupsResponse -> ShowS
$cshowsPrec :: Int -> DescribeGroupsResponse -> ShowS
Prelude.Show, forall x. Rep DescribeGroupsResponse x -> DescribeGroupsResponse
forall x. DescribeGroupsResponse -> Rep DescribeGroupsResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DescribeGroupsResponse x -> DescribeGroupsResponse
$cfrom :: forall x. DescribeGroupsResponse -> Rep DescribeGroupsResponse x
Prelude.Generic)
newDescribeGroupsResponse ::
Prelude.Int ->
DescribeGroupsResponse
newDescribeGroupsResponse :: Int -> DescribeGroupsResponse
newDescribeGroupsResponse Int
pHttpStatus_ =
DescribeGroupsResponse'
{ $sel:groups:DescribeGroupsResponse' :: Maybe [GroupMetadata]
groups = forall a. Maybe a
Prelude.Nothing,
$sel:marker:DescribeGroupsResponse' :: Maybe Text
marker = forall a. Maybe a
Prelude.Nothing,
$sel:httpStatus:DescribeGroupsResponse' :: Int
httpStatus = Int
pHttpStatus_
}
describeGroupsResponse_groups :: Lens.Lens' DescribeGroupsResponse (Prelude.Maybe [GroupMetadata])
describeGroupsResponse_groups :: Lens' DescribeGroupsResponse (Maybe [GroupMetadata])
describeGroupsResponse_groups = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeGroupsResponse' {Maybe [GroupMetadata]
groups :: Maybe [GroupMetadata]
$sel:groups:DescribeGroupsResponse' :: DescribeGroupsResponse -> Maybe [GroupMetadata]
groups} -> Maybe [GroupMetadata]
groups) (\s :: DescribeGroupsResponse
s@DescribeGroupsResponse' {} Maybe [GroupMetadata]
a -> DescribeGroupsResponse
s {$sel:groups:DescribeGroupsResponse' :: Maybe [GroupMetadata]
groups = Maybe [GroupMetadata]
a} :: DescribeGroupsResponse) 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
describeGroupsResponse_marker :: Lens.Lens' DescribeGroupsResponse (Prelude.Maybe Prelude.Text)
describeGroupsResponse_marker :: Lens' DescribeGroupsResponse (Maybe Text)
describeGroupsResponse_marker = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeGroupsResponse' {Maybe Text
marker :: Maybe Text
$sel:marker:DescribeGroupsResponse' :: DescribeGroupsResponse -> Maybe Text
marker} -> Maybe Text
marker) (\s :: DescribeGroupsResponse
s@DescribeGroupsResponse' {} Maybe Text
a -> DescribeGroupsResponse
s {$sel:marker:DescribeGroupsResponse' :: Maybe Text
marker = Maybe Text
a} :: DescribeGroupsResponse)
describeGroupsResponse_httpStatus :: Lens.Lens' DescribeGroupsResponse Prelude.Int
describeGroupsResponse_httpStatus :: Lens' DescribeGroupsResponse Int
describeGroupsResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeGroupsResponse' {Int
httpStatus :: Int
$sel:httpStatus:DescribeGroupsResponse' :: DescribeGroupsResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: DescribeGroupsResponse
s@DescribeGroupsResponse' {} Int
a -> DescribeGroupsResponse
s {$sel:httpStatus:DescribeGroupsResponse' :: Int
httpStatus = Int
a} :: DescribeGroupsResponse)
instance Prelude.NFData DescribeGroupsResponse where
rnf :: DescribeGroupsResponse -> ()
rnf DescribeGroupsResponse' {Int
Maybe [GroupMetadata]
Maybe Text
httpStatus :: Int
marker :: Maybe Text
groups :: Maybe [GroupMetadata]
$sel:httpStatus:DescribeGroupsResponse' :: DescribeGroupsResponse -> Int
$sel:marker:DescribeGroupsResponse' :: DescribeGroupsResponse -> Maybe Text
$sel:groups:DescribeGroupsResponse' :: DescribeGroupsResponse -> Maybe [GroupMetadata]
..} =
forall a. NFData a => a -> ()
Prelude.rnf Maybe [GroupMetadata]
groups
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 Int
httpStatus