{-# 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.IoTSiteWise.BatchGetAssetPropertyAggregates
(
BatchGetAssetPropertyAggregates (..),
newBatchGetAssetPropertyAggregates,
batchGetAssetPropertyAggregates_maxResults,
batchGetAssetPropertyAggregates_nextToken,
batchGetAssetPropertyAggregates_entries,
BatchGetAssetPropertyAggregatesResponse (..),
newBatchGetAssetPropertyAggregatesResponse,
batchGetAssetPropertyAggregatesResponse_nextToken,
batchGetAssetPropertyAggregatesResponse_httpStatus,
batchGetAssetPropertyAggregatesResponse_errorEntries,
batchGetAssetPropertyAggregatesResponse_successEntries,
batchGetAssetPropertyAggregatesResponse_skippedEntries,
)
where
import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.IoTSiteWise.Types
import qualified Amazonka.Prelude as Prelude
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response
data BatchGetAssetPropertyAggregates = BatchGetAssetPropertyAggregates'
{
BatchGetAssetPropertyAggregates -> Maybe Natural
maxResults :: Prelude.Maybe Prelude.Natural,
BatchGetAssetPropertyAggregates -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
BatchGetAssetPropertyAggregates
-> [BatchGetAssetPropertyAggregatesEntry]
entries :: [BatchGetAssetPropertyAggregatesEntry]
}
deriving (BatchGetAssetPropertyAggregates
-> BatchGetAssetPropertyAggregates -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: BatchGetAssetPropertyAggregates
-> BatchGetAssetPropertyAggregates -> Bool
$c/= :: BatchGetAssetPropertyAggregates
-> BatchGetAssetPropertyAggregates -> Bool
== :: BatchGetAssetPropertyAggregates
-> BatchGetAssetPropertyAggregates -> Bool
$c== :: BatchGetAssetPropertyAggregates
-> BatchGetAssetPropertyAggregates -> Bool
Prelude.Eq, ReadPrec [BatchGetAssetPropertyAggregates]
ReadPrec BatchGetAssetPropertyAggregates
Int -> ReadS BatchGetAssetPropertyAggregates
ReadS [BatchGetAssetPropertyAggregates]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [BatchGetAssetPropertyAggregates]
$creadListPrec :: ReadPrec [BatchGetAssetPropertyAggregates]
readPrec :: ReadPrec BatchGetAssetPropertyAggregates
$creadPrec :: ReadPrec BatchGetAssetPropertyAggregates
readList :: ReadS [BatchGetAssetPropertyAggregates]
$creadList :: ReadS [BatchGetAssetPropertyAggregates]
readsPrec :: Int -> ReadS BatchGetAssetPropertyAggregates
$creadsPrec :: Int -> ReadS BatchGetAssetPropertyAggregates
Prelude.Read, Int -> BatchGetAssetPropertyAggregates -> ShowS
[BatchGetAssetPropertyAggregates] -> ShowS
BatchGetAssetPropertyAggregates -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [BatchGetAssetPropertyAggregates] -> ShowS
$cshowList :: [BatchGetAssetPropertyAggregates] -> ShowS
show :: BatchGetAssetPropertyAggregates -> String
$cshow :: BatchGetAssetPropertyAggregates -> String
showsPrec :: Int -> BatchGetAssetPropertyAggregates -> ShowS
$cshowsPrec :: Int -> BatchGetAssetPropertyAggregates -> ShowS
Prelude.Show, forall x.
Rep BatchGetAssetPropertyAggregates x
-> BatchGetAssetPropertyAggregates
forall x.
BatchGetAssetPropertyAggregates
-> Rep BatchGetAssetPropertyAggregates x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep BatchGetAssetPropertyAggregates x
-> BatchGetAssetPropertyAggregates
$cfrom :: forall x.
BatchGetAssetPropertyAggregates
-> Rep BatchGetAssetPropertyAggregates x
Prelude.Generic)
newBatchGetAssetPropertyAggregates ::
BatchGetAssetPropertyAggregates
newBatchGetAssetPropertyAggregates :: BatchGetAssetPropertyAggregates
newBatchGetAssetPropertyAggregates =
BatchGetAssetPropertyAggregates'
{ $sel:maxResults:BatchGetAssetPropertyAggregates' :: Maybe Natural
maxResults =
forall a. Maybe a
Prelude.Nothing,
$sel:nextToken:BatchGetAssetPropertyAggregates' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing,
$sel:entries:BatchGetAssetPropertyAggregates' :: [BatchGetAssetPropertyAggregatesEntry]
entries = forall a. Monoid a => a
Prelude.mempty
}
batchGetAssetPropertyAggregates_maxResults :: Lens.Lens' BatchGetAssetPropertyAggregates (Prelude.Maybe Prelude.Natural)
batchGetAssetPropertyAggregates_maxResults :: Lens' BatchGetAssetPropertyAggregates (Maybe Natural)
batchGetAssetPropertyAggregates_maxResults = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchGetAssetPropertyAggregates' {Maybe Natural
maxResults :: Maybe Natural
$sel:maxResults:BatchGetAssetPropertyAggregates' :: BatchGetAssetPropertyAggregates -> Maybe Natural
maxResults} -> Maybe Natural
maxResults) (\s :: BatchGetAssetPropertyAggregates
s@BatchGetAssetPropertyAggregates' {} Maybe Natural
a -> BatchGetAssetPropertyAggregates
s {$sel:maxResults:BatchGetAssetPropertyAggregates' :: Maybe Natural
maxResults = Maybe Natural
a} :: BatchGetAssetPropertyAggregates)
batchGetAssetPropertyAggregates_nextToken :: Lens.Lens' BatchGetAssetPropertyAggregates (Prelude.Maybe Prelude.Text)
batchGetAssetPropertyAggregates_nextToken :: Lens' BatchGetAssetPropertyAggregates (Maybe Text)
batchGetAssetPropertyAggregates_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchGetAssetPropertyAggregates' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:BatchGetAssetPropertyAggregates' :: BatchGetAssetPropertyAggregates -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: BatchGetAssetPropertyAggregates
s@BatchGetAssetPropertyAggregates' {} Maybe Text
a -> BatchGetAssetPropertyAggregates
s {$sel:nextToken:BatchGetAssetPropertyAggregates' :: Maybe Text
nextToken = Maybe Text
a} :: BatchGetAssetPropertyAggregates)
batchGetAssetPropertyAggregates_entries :: Lens.Lens' BatchGetAssetPropertyAggregates [BatchGetAssetPropertyAggregatesEntry]
batchGetAssetPropertyAggregates_entries :: Lens'
BatchGetAssetPropertyAggregates
[BatchGetAssetPropertyAggregatesEntry]
batchGetAssetPropertyAggregates_entries = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchGetAssetPropertyAggregates' {[BatchGetAssetPropertyAggregatesEntry]
entries :: [BatchGetAssetPropertyAggregatesEntry]
$sel:entries:BatchGetAssetPropertyAggregates' :: BatchGetAssetPropertyAggregates
-> [BatchGetAssetPropertyAggregatesEntry]
entries} -> [BatchGetAssetPropertyAggregatesEntry]
entries) (\s :: BatchGetAssetPropertyAggregates
s@BatchGetAssetPropertyAggregates' {} [BatchGetAssetPropertyAggregatesEntry]
a -> BatchGetAssetPropertyAggregates
s {$sel:entries:BatchGetAssetPropertyAggregates' :: [BatchGetAssetPropertyAggregatesEntry]
entries = [BatchGetAssetPropertyAggregatesEntry]
a} :: BatchGetAssetPropertyAggregates) 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
Core.AWSRequest
BatchGetAssetPropertyAggregates
where
type
AWSResponse BatchGetAssetPropertyAggregates =
BatchGetAssetPropertyAggregatesResponse
request :: (Service -> Service)
-> BatchGetAssetPropertyAggregates
-> Request BatchGetAssetPropertyAggregates
request Service -> Service
overrides =
forall a. (ToRequest a, ToJSON a) => Service -> a -> Request a
Request.postJSON (Service -> Service
overrides Service
defaultService)
response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy BatchGetAssetPropertyAggregates
-> ClientResponse ClientBody
-> m (Either
Error
(ClientResponse (AWSResponse BatchGetAssetPropertyAggregates)))
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
-> [BatchGetAssetPropertyAggregatesErrorEntry]
-> [BatchGetAssetPropertyAggregatesSuccessEntry]
-> [BatchGetAssetPropertyAggregatesSkippedEntry]
-> BatchGetAssetPropertyAggregatesResponse
BatchGetAssetPropertyAggregatesResponse'
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
"errorEntries" 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
"successEntries" 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
"skippedEntries"
forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ forall a. Monoid a => a
Prelude.mempty
)
)
instance
Prelude.Hashable
BatchGetAssetPropertyAggregates
where
hashWithSalt :: Int -> BatchGetAssetPropertyAggregates -> Int
hashWithSalt
Int
_salt
BatchGetAssetPropertyAggregates' {[BatchGetAssetPropertyAggregatesEntry]
Maybe Natural
Maybe Text
entries :: [BatchGetAssetPropertyAggregatesEntry]
nextToken :: Maybe Text
maxResults :: Maybe Natural
$sel:entries:BatchGetAssetPropertyAggregates' :: BatchGetAssetPropertyAggregates
-> [BatchGetAssetPropertyAggregatesEntry]
$sel:nextToken:BatchGetAssetPropertyAggregates' :: BatchGetAssetPropertyAggregates -> Maybe Text
$sel:maxResults:BatchGetAssetPropertyAggregates' :: BatchGetAssetPropertyAggregates -> 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` [BatchGetAssetPropertyAggregatesEntry]
entries
instance
Prelude.NFData
BatchGetAssetPropertyAggregates
where
rnf :: BatchGetAssetPropertyAggregates -> ()
rnf BatchGetAssetPropertyAggregates' {[BatchGetAssetPropertyAggregatesEntry]
Maybe Natural
Maybe Text
entries :: [BatchGetAssetPropertyAggregatesEntry]
nextToken :: Maybe Text
maxResults :: Maybe Natural
$sel:entries:BatchGetAssetPropertyAggregates' :: BatchGetAssetPropertyAggregates
-> [BatchGetAssetPropertyAggregatesEntry]
$sel:nextToken:BatchGetAssetPropertyAggregates' :: BatchGetAssetPropertyAggregates -> Maybe Text
$sel:maxResults:BatchGetAssetPropertyAggregates' :: BatchGetAssetPropertyAggregates -> 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 [BatchGetAssetPropertyAggregatesEntry]
entries
instance
Data.ToHeaders
BatchGetAssetPropertyAggregates
where
toHeaders :: BatchGetAssetPropertyAggregates -> 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.ToJSON BatchGetAssetPropertyAggregates where
toJSON :: BatchGetAssetPropertyAggregates -> Value
toJSON BatchGetAssetPropertyAggregates' {[BatchGetAssetPropertyAggregatesEntry]
Maybe Natural
Maybe Text
entries :: [BatchGetAssetPropertyAggregatesEntry]
nextToken :: Maybe Text
maxResults :: Maybe Natural
$sel:entries:BatchGetAssetPropertyAggregates' :: BatchGetAssetPropertyAggregates
-> [BatchGetAssetPropertyAggregatesEntry]
$sel:nextToken:BatchGetAssetPropertyAggregates' :: BatchGetAssetPropertyAggregates -> Maybe Text
$sel:maxResults:BatchGetAssetPropertyAggregates' :: BatchGetAssetPropertyAggregates -> Maybe Natural
..} =
[Pair] -> Value
Data.object
( forall a. [Maybe a] -> [a]
Prelude.catMaybes
[ (Key
"maxResults" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
maxResults,
(Key
"nextToken" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
nextToken,
forall a. a -> Maybe a
Prelude.Just (Key
"entries" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= [BatchGetAssetPropertyAggregatesEntry]
entries)
]
)
instance Data.ToPath BatchGetAssetPropertyAggregates where
toPath :: BatchGetAssetPropertyAggregates -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/properties/batch/aggregates"
instance Data.ToQuery BatchGetAssetPropertyAggregates where
toQuery :: BatchGetAssetPropertyAggregates -> QueryString
toQuery = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty
data BatchGetAssetPropertyAggregatesResponse = BatchGetAssetPropertyAggregatesResponse'
{
BatchGetAssetPropertyAggregatesResponse -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
BatchGetAssetPropertyAggregatesResponse -> Int
httpStatus :: Prelude.Int,
BatchGetAssetPropertyAggregatesResponse
-> [BatchGetAssetPropertyAggregatesErrorEntry]
errorEntries :: [BatchGetAssetPropertyAggregatesErrorEntry],
BatchGetAssetPropertyAggregatesResponse
-> [BatchGetAssetPropertyAggregatesSuccessEntry]
successEntries :: [BatchGetAssetPropertyAggregatesSuccessEntry],
BatchGetAssetPropertyAggregatesResponse
-> [BatchGetAssetPropertyAggregatesSkippedEntry]
skippedEntries :: [BatchGetAssetPropertyAggregatesSkippedEntry]
}
deriving (BatchGetAssetPropertyAggregatesResponse
-> BatchGetAssetPropertyAggregatesResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: BatchGetAssetPropertyAggregatesResponse
-> BatchGetAssetPropertyAggregatesResponse -> Bool
$c/= :: BatchGetAssetPropertyAggregatesResponse
-> BatchGetAssetPropertyAggregatesResponse -> Bool
== :: BatchGetAssetPropertyAggregatesResponse
-> BatchGetAssetPropertyAggregatesResponse -> Bool
$c== :: BatchGetAssetPropertyAggregatesResponse
-> BatchGetAssetPropertyAggregatesResponse -> Bool
Prelude.Eq, ReadPrec [BatchGetAssetPropertyAggregatesResponse]
ReadPrec BatchGetAssetPropertyAggregatesResponse
Int -> ReadS BatchGetAssetPropertyAggregatesResponse
ReadS [BatchGetAssetPropertyAggregatesResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [BatchGetAssetPropertyAggregatesResponse]
$creadListPrec :: ReadPrec [BatchGetAssetPropertyAggregatesResponse]
readPrec :: ReadPrec BatchGetAssetPropertyAggregatesResponse
$creadPrec :: ReadPrec BatchGetAssetPropertyAggregatesResponse
readList :: ReadS [BatchGetAssetPropertyAggregatesResponse]
$creadList :: ReadS [BatchGetAssetPropertyAggregatesResponse]
readsPrec :: Int -> ReadS BatchGetAssetPropertyAggregatesResponse
$creadsPrec :: Int -> ReadS BatchGetAssetPropertyAggregatesResponse
Prelude.Read, Int -> BatchGetAssetPropertyAggregatesResponse -> ShowS
[BatchGetAssetPropertyAggregatesResponse] -> ShowS
BatchGetAssetPropertyAggregatesResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [BatchGetAssetPropertyAggregatesResponse] -> ShowS
$cshowList :: [BatchGetAssetPropertyAggregatesResponse] -> ShowS
show :: BatchGetAssetPropertyAggregatesResponse -> String
$cshow :: BatchGetAssetPropertyAggregatesResponse -> String
showsPrec :: Int -> BatchGetAssetPropertyAggregatesResponse -> ShowS
$cshowsPrec :: Int -> BatchGetAssetPropertyAggregatesResponse -> ShowS
Prelude.Show, forall x.
Rep BatchGetAssetPropertyAggregatesResponse x
-> BatchGetAssetPropertyAggregatesResponse
forall x.
BatchGetAssetPropertyAggregatesResponse
-> Rep BatchGetAssetPropertyAggregatesResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep BatchGetAssetPropertyAggregatesResponse x
-> BatchGetAssetPropertyAggregatesResponse
$cfrom :: forall x.
BatchGetAssetPropertyAggregatesResponse
-> Rep BatchGetAssetPropertyAggregatesResponse x
Prelude.Generic)
newBatchGetAssetPropertyAggregatesResponse ::
Prelude.Int ->
BatchGetAssetPropertyAggregatesResponse
newBatchGetAssetPropertyAggregatesResponse :: Int -> BatchGetAssetPropertyAggregatesResponse
newBatchGetAssetPropertyAggregatesResponse
Int
pHttpStatus_ =
BatchGetAssetPropertyAggregatesResponse'
{ $sel:nextToken:BatchGetAssetPropertyAggregatesResponse' :: Maybe Text
nextToken =
forall a. Maybe a
Prelude.Nothing,
$sel:httpStatus:BatchGetAssetPropertyAggregatesResponse' :: Int
httpStatus = Int
pHttpStatus_,
$sel:errorEntries:BatchGetAssetPropertyAggregatesResponse' :: [BatchGetAssetPropertyAggregatesErrorEntry]
errorEntries = forall a. Monoid a => a
Prelude.mempty,
$sel:successEntries:BatchGetAssetPropertyAggregatesResponse' :: [BatchGetAssetPropertyAggregatesSuccessEntry]
successEntries = forall a. Monoid a => a
Prelude.mempty,
$sel:skippedEntries:BatchGetAssetPropertyAggregatesResponse' :: [BatchGetAssetPropertyAggregatesSkippedEntry]
skippedEntries = forall a. Monoid a => a
Prelude.mempty
}
batchGetAssetPropertyAggregatesResponse_nextToken :: Lens.Lens' BatchGetAssetPropertyAggregatesResponse (Prelude.Maybe Prelude.Text)
batchGetAssetPropertyAggregatesResponse_nextToken :: Lens' BatchGetAssetPropertyAggregatesResponse (Maybe Text)
batchGetAssetPropertyAggregatesResponse_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchGetAssetPropertyAggregatesResponse' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:BatchGetAssetPropertyAggregatesResponse' :: BatchGetAssetPropertyAggregatesResponse -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: BatchGetAssetPropertyAggregatesResponse
s@BatchGetAssetPropertyAggregatesResponse' {} Maybe Text
a -> BatchGetAssetPropertyAggregatesResponse
s {$sel:nextToken:BatchGetAssetPropertyAggregatesResponse' :: Maybe Text
nextToken = Maybe Text
a} :: BatchGetAssetPropertyAggregatesResponse)
batchGetAssetPropertyAggregatesResponse_httpStatus :: Lens.Lens' BatchGetAssetPropertyAggregatesResponse Prelude.Int
batchGetAssetPropertyAggregatesResponse_httpStatus :: Lens' BatchGetAssetPropertyAggregatesResponse Int
batchGetAssetPropertyAggregatesResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchGetAssetPropertyAggregatesResponse' {Int
httpStatus :: Int
$sel:httpStatus:BatchGetAssetPropertyAggregatesResponse' :: BatchGetAssetPropertyAggregatesResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: BatchGetAssetPropertyAggregatesResponse
s@BatchGetAssetPropertyAggregatesResponse' {} Int
a -> BatchGetAssetPropertyAggregatesResponse
s {$sel:httpStatus:BatchGetAssetPropertyAggregatesResponse' :: Int
httpStatus = Int
a} :: BatchGetAssetPropertyAggregatesResponse)
batchGetAssetPropertyAggregatesResponse_errorEntries :: Lens.Lens' BatchGetAssetPropertyAggregatesResponse [BatchGetAssetPropertyAggregatesErrorEntry]
batchGetAssetPropertyAggregatesResponse_errorEntries :: Lens'
BatchGetAssetPropertyAggregatesResponse
[BatchGetAssetPropertyAggregatesErrorEntry]
batchGetAssetPropertyAggregatesResponse_errorEntries = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchGetAssetPropertyAggregatesResponse' {[BatchGetAssetPropertyAggregatesErrorEntry]
errorEntries :: [BatchGetAssetPropertyAggregatesErrorEntry]
$sel:errorEntries:BatchGetAssetPropertyAggregatesResponse' :: BatchGetAssetPropertyAggregatesResponse
-> [BatchGetAssetPropertyAggregatesErrorEntry]
errorEntries} -> [BatchGetAssetPropertyAggregatesErrorEntry]
errorEntries) (\s :: BatchGetAssetPropertyAggregatesResponse
s@BatchGetAssetPropertyAggregatesResponse' {} [BatchGetAssetPropertyAggregatesErrorEntry]
a -> BatchGetAssetPropertyAggregatesResponse
s {$sel:errorEntries:BatchGetAssetPropertyAggregatesResponse' :: [BatchGetAssetPropertyAggregatesErrorEntry]
errorEntries = [BatchGetAssetPropertyAggregatesErrorEntry]
a} :: BatchGetAssetPropertyAggregatesResponse) 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
batchGetAssetPropertyAggregatesResponse_successEntries :: Lens.Lens' BatchGetAssetPropertyAggregatesResponse [BatchGetAssetPropertyAggregatesSuccessEntry]
batchGetAssetPropertyAggregatesResponse_successEntries :: Lens'
BatchGetAssetPropertyAggregatesResponse
[BatchGetAssetPropertyAggregatesSuccessEntry]
batchGetAssetPropertyAggregatesResponse_successEntries = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchGetAssetPropertyAggregatesResponse' {[BatchGetAssetPropertyAggregatesSuccessEntry]
successEntries :: [BatchGetAssetPropertyAggregatesSuccessEntry]
$sel:successEntries:BatchGetAssetPropertyAggregatesResponse' :: BatchGetAssetPropertyAggregatesResponse
-> [BatchGetAssetPropertyAggregatesSuccessEntry]
successEntries} -> [BatchGetAssetPropertyAggregatesSuccessEntry]
successEntries) (\s :: BatchGetAssetPropertyAggregatesResponse
s@BatchGetAssetPropertyAggregatesResponse' {} [BatchGetAssetPropertyAggregatesSuccessEntry]
a -> BatchGetAssetPropertyAggregatesResponse
s {$sel:successEntries:BatchGetAssetPropertyAggregatesResponse' :: [BatchGetAssetPropertyAggregatesSuccessEntry]
successEntries = [BatchGetAssetPropertyAggregatesSuccessEntry]
a} :: BatchGetAssetPropertyAggregatesResponse) 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
batchGetAssetPropertyAggregatesResponse_skippedEntries :: Lens.Lens' BatchGetAssetPropertyAggregatesResponse [BatchGetAssetPropertyAggregatesSkippedEntry]
batchGetAssetPropertyAggregatesResponse_skippedEntries :: Lens'
BatchGetAssetPropertyAggregatesResponse
[BatchGetAssetPropertyAggregatesSkippedEntry]
batchGetAssetPropertyAggregatesResponse_skippedEntries = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchGetAssetPropertyAggregatesResponse' {[BatchGetAssetPropertyAggregatesSkippedEntry]
skippedEntries :: [BatchGetAssetPropertyAggregatesSkippedEntry]
$sel:skippedEntries:BatchGetAssetPropertyAggregatesResponse' :: BatchGetAssetPropertyAggregatesResponse
-> [BatchGetAssetPropertyAggregatesSkippedEntry]
skippedEntries} -> [BatchGetAssetPropertyAggregatesSkippedEntry]
skippedEntries) (\s :: BatchGetAssetPropertyAggregatesResponse
s@BatchGetAssetPropertyAggregatesResponse' {} [BatchGetAssetPropertyAggregatesSkippedEntry]
a -> BatchGetAssetPropertyAggregatesResponse
s {$sel:skippedEntries:BatchGetAssetPropertyAggregatesResponse' :: [BatchGetAssetPropertyAggregatesSkippedEntry]
skippedEntries = [BatchGetAssetPropertyAggregatesSkippedEntry]
a} :: BatchGetAssetPropertyAggregatesResponse) 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
BatchGetAssetPropertyAggregatesResponse
where
rnf :: BatchGetAssetPropertyAggregatesResponse -> ()
rnf BatchGetAssetPropertyAggregatesResponse' {Int
[BatchGetAssetPropertyAggregatesErrorEntry]
[BatchGetAssetPropertyAggregatesSkippedEntry]
[BatchGetAssetPropertyAggregatesSuccessEntry]
Maybe Text
skippedEntries :: [BatchGetAssetPropertyAggregatesSkippedEntry]
successEntries :: [BatchGetAssetPropertyAggregatesSuccessEntry]
errorEntries :: [BatchGetAssetPropertyAggregatesErrorEntry]
httpStatus :: Int
nextToken :: Maybe Text
$sel:skippedEntries:BatchGetAssetPropertyAggregatesResponse' :: BatchGetAssetPropertyAggregatesResponse
-> [BatchGetAssetPropertyAggregatesSkippedEntry]
$sel:successEntries:BatchGetAssetPropertyAggregatesResponse' :: BatchGetAssetPropertyAggregatesResponse
-> [BatchGetAssetPropertyAggregatesSuccessEntry]
$sel:errorEntries:BatchGetAssetPropertyAggregatesResponse' :: BatchGetAssetPropertyAggregatesResponse
-> [BatchGetAssetPropertyAggregatesErrorEntry]
$sel:httpStatus:BatchGetAssetPropertyAggregatesResponse' :: BatchGetAssetPropertyAggregatesResponse -> Int
$sel:nextToken:BatchGetAssetPropertyAggregatesResponse' :: BatchGetAssetPropertyAggregatesResponse -> 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 [BatchGetAssetPropertyAggregatesErrorEntry]
errorEntries
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf [BatchGetAssetPropertyAggregatesSuccessEntry]
successEntries
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf [BatchGetAssetPropertyAggregatesSkippedEntry]
skippedEntries