{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}

-- Derived from AWS service descriptions, licensed under Apache 2.0.

-- |
-- Module      : Amazonka.CloudDirectory.Types.BatchWriteOperationResponse
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
module Amazonka.CloudDirectory.Types.BatchWriteOperationResponse where

import Amazonka.CloudDirectory.Types.BatchAddFacetToObjectResponse
import Amazonka.CloudDirectory.Types.BatchAttachObjectResponse
import Amazonka.CloudDirectory.Types.BatchAttachPolicyResponse
import Amazonka.CloudDirectory.Types.BatchAttachToIndexResponse
import Amazonka.CloudDirectory.Types.BatchAttachTypedLinkResponse
import Amazonka.CloudDirectory.Types.BatchCreateIndexResponse
import Amazonka.CloudDirectory.Types.BatchCreateObjectResponse
import Amazonka.CloudDirectory.Types.BatchDeleteObjectResponse
import Amazonka.CloudDirectory.Types.BatchDetachFromIndexResponse
import Amazonka.CloudDirectory.Types.BatchDetachObjectResponse
import Amazonka.CloudDirectory.Types.BatchDetachPolicyResponse
import Amazonka.CloudDirectory.Types.BatchDetachTypedLinkResponse
import Amazonka.CloudDirectory.Types.BatchRemoveFacetFromObjectResponse
import Amazonka.CloudDirectory.Types.BatchUpdateLinkAttributesResponse
import Amazonka.CloudDirectory.Types.BatchUpdateObjectAttributesResponse
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

-- | Represents the output of a @BatchWrite@ response operation.
--
-- /See:/ 'newBatchWriteOperationResponse' smart constructor.
data BatchWriteOperationResponse = BatchWriteOperationResponse'
  { -- | The result of an add facet to object batch operation.
    BatchWriteOperationResponse -> Maybe BatchAddFacetToObjectResponse
addFacetToObject :: Prelude.Maybe BatchAddFacetToObjectResponse,
    -- | Attaches an object to a Directory.
    BatchWriteOperationResponse -> Maybe BatchAttachObjectResponse
attachObject :: Prelude.Maybe BatchAttachObjectResponse,
    -- | Attaches a policy object to a regular object. An object can have a
    -- limited number of attached policies.
    BatchWriteOperationResponse -> Maybe BatchAttachPolicyResponse
attachPolicy :: Prelude.Maybe BatchAttachPolicyResponse,
    -- | Attaches the specified object to the specified index.
    BatchWriteOperationResponse -> Maybe BatchAttachToIndexResponse
attachToIndex :: Prelude.Maybe BatchAttachToIndexResponse,
    -- | Attaches a typed link to a specified source and target object. For more
    -- information, see
    -- <https://docs.aws.amazon.com/clouddirectory/latest/developerguide/directory_objects_links.html#directory_objects_links_typedlink Typed Links>.
    BatchWriteOperationResponse -> Maybe BatchAttachTypedLinkResponse
attachTypedLink :: Prelude.Maybe BatchAttachTypedLinkResponse,
    -- | Creates an index object. See
    -- <https://docs.aws.amazon.com/clouddirectory/latest/developerguide/indexing_search.htm Indexing and search>
    -- for more information.
    BatchWriteOperationResponse -> Maybe BatchCreateIndexResponse
createIndex :: Prelude.Maybe BatchCreateIndexResponse,
    -- | Creates an object in a Directory.
    BatchWriteOperationResponse -> Maybe BatchCreateObjectResponse
createObject :: Prelude.Maybe BatchCreateObjectResponse,
    -- | Deletes an object in a Directory.
    BatchWriteOperationResponse -> Maybe BatchDeleteObjectResponse
deleteObject :: Prelude.Maybe BatchDeleteObjectResponse,
    -- | Detaches the specified object from the specified index.
    BatchWriteOperationResponse -> Maybe BatchDetachFromIndexResponse
detachFromIndex :: Prelude.Maybe BatchDetachFromIndexResponse,
    -- | Detaches an object from a Directory.
    BatchWriteOperationResponse -> Maybe BatchDetachObjectResponse
detachObject :: Prelude.Maybe BatchDetachObjectResponse,
    -- | Detaches a policy from a Directory.
    BatchWriteOperationResponse -> Maybe BatchDetachPolicyResponse
detachPolicy :: Prelude.Maybe BatchDetachPolicyResponse,
    -- | Detaches a typed link from a specified source and target object. For
    -- more information, see
    -- <https://docs.aws.amazon.com/clouddirectory/latest/developerguide/directory_objects_links.html#directory_objects_links_typedlink Typed Links>.
    BatchWriteOperationResponse -> Maybe BatchDetachTypedLinkResponse
detachTypedLink :: Prelude.Maybe BatchDetachTypedLinkResponse,
    -- | The result of a batch remove facet from object operation.
    BatchWriteOperationResponse
-> Maybe BatchRemoveFacetFromObjectResponse
removeFacetFromObject :: Prelude.Maybe BatchRemoveFacetFromObjectResponse,
    -- | Represents the output of a @BatchWrite@ response operation.
    BatchWriteOperationResponse
-> Maybe BatchUpdateLinkAttributesResponse
updateLinkAttributes :: Prelude.Maybe BatchUpdateLinkAttributesResponse,
    -- | Updates a given object’s attributes.
    BatchWriteOperationResponse
-> Maybe BatchUpdateObjectAttributesResponse
updateObjectAttributes :: Prelude.Maybe BatchUpdateObjectAttributesResponse
  }
  deriving (BatchWriteOperationResponse -> BatchWriteOperationResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: BatchWriteOperationResponse -> BatchWriteOperationResponse -> Bool
$c/= :: BatchWriteOperationResponse -> BatchWriteOperationResponse -> Bool
== :: BatchWriteOperationResponse -> BatchWriteOperationResponse -> Bool
$c== :: BatchWriteOperationResponse -> BatchWriteOperationResponse -> Bool
Prelude.Eq, ReadPrec [BatchWriteOperationResponse]
ReadPrec BatchWriteOperationResponse
Int -> ReadS BatchWriteOperationResponse
ReadS [BatchWriteOperationResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [BatchWriteOperationResponse]
$creadListPrec :: ReadPrec [BatchWriteOperationResponse]
readPrec :: ReadPrec BatchWriteOperationResponse
$creadPrec :: ReadPrec BatchWriteOperationResponse
readList :: ReadS [BatchWriteOperationResponse]
$creadList :: ReadS [BatchWriteOperationResponse]
readsPrec :: Int -> ReadS BatchWriteOperationResponse
$creadsPrec :: Int -> ReadS BatchWriteOperationResponse
Prelude.Read, Int -> BatchWriteOperationResponse -> ShowS
[BatchWriteOperationResponse] -> ShowS
BatchWriteOperationResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [BatchWriteOperationResponse] -> ShowS
$cshowList :: [BatchWriteOperationResponse] -> ShowS
show :: BatchWriteOperationResponse -> String
$cshow :: BatchWriteOperationResponse -> String
showsPrec :: Int -> BatchWriteOperationResponse -> ShowS
$cshowsPrec :: Int -> BatchWriteOperationResponse -> ShowS
Prelude.Show, forall x.
Rep BatchWriteOperationResponse x -> BatchWriteOperationResponse
forall x.
BatchWriteOperationResponse -> Rep BatchWriteOperationResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep BatchWriteOperationResponse x -> BatchWriteOperationResponse
$cfrom :: forall x.
BatchWriteOperationResponse -> Rep BatchWriteOperationResponse x
Prelude.Generic)

-- |
-- Create a value of 'BatchWriteOperationResponse' 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:
--
-- 'addFacetToObject', 'batchWriteOperationResponse_addFacetToObject' - The result of an add facet to object batch operation.
--
-- 'attachObject', 'batchWriteOperationResponse_attachObject' - Attaches an object to a Directory.
--
-- 'attachPolicy', 'batchWriteOperationResponse_attachPolicy' - Attaches a policy object to a regular object. An object can have a
-- limited number of attached policies.
--
-- 'attachToIndex', 'batchWriteOperationResponse_attachToIndex' - Attaches the specified object to the specified index.
--
-- 'attachTypedLink', 'batchWriteOperationResponse_attachTypedLink' - Attaches a typed link to a specified source and target object. For more
-- information, see
-- <https://docs.aws.amazon.com/clouddirectory/latest/developerguide/directory_objects_links.html#directory_objects_links_typedlink Typed Links>.
--
-- 'createIndex', 'batchWriteOperationResponse_createIndex' - Creates an index object. See
-- <https://docs.aws.amazon.com/clouddirectory/latest/developerguide/indexing_search.htm Indexing and search>
-- for more information.
--
-- 'createObject', 'batchWriteOperationResponse_createObject' - Creates an object in a Directory.
--
-- 'deleteObject', 'batchWriteOperationResponse_deleteObject' - Deletes an object in a Directory.
--
-- 'detachFromIndex', 'batchWriteOperationResponse_detachFromIndex' - Detaches the specified object from the specified index.
--
-- 'detachObject', 'batchWriteOperationResponse_detachObject' - Detaches an object from a Directory.
--
-- 'detachPolicy', 'batchWriteOperationResponse_detachPolicy' - Detaches a policy from a Directory.
--
-- 'detachTypedLink', 'batchWriteOperationResponse_detachTypedLink' - Detaches a typed link from a specified source and target object. For
-- more information, see
-- <https://docs.aws.amazon.com/clouddirectory/latest/developerguide/directory_objects_links.html#directory_objects_links_typedlink Typed Links>.
--
-- 'removeFacetFromObject', 'batchWriteOperationResponse_removeFacetFromObject' - The result of a batch remove facet from object operation.
--
-- 'updateLinkAttributes', 'batchWriteOperationResponse_updateLinkAttributes' - Represents the output of a @BatchWrite@ response operation.
--
-- 'updateObjectAttributes', 'batchWriteOperationResponse_updateObjectAttributes' - Updates a given object’s attributes.
newBatchWriteOperationResponse ::
  BatchWriteOperationResponse
newBatchWriteOperationResponse :: BatchWriteOperationResponse
newBatchWriteOperationResponse =
  BatchWriteOperationResponse'
    { $sel:addFacetToObject:BatchWriteOperationResponse' :: Maybe BatchAddFacetToObjectResponse
addFacetToObject =
        forall a. Maybe a
Prelude.Nothing,
      $sel:attachObject:BatchWriteOperationResponse' :: Maybe BatchAttachObjectResponse
attachObject = forall a. Maybe a
Prelude.Nothing,
      $sel:attachPolicy:BatchWriteOperationResponse' :: Maybe BatchAttachPolicyResponse
attachPolicy = forall a. Maybe a
Prelude.Nothing,
      $sel:attachToIndex:BatchWriteOperationResponse' :: Maybe BatchAttachToIndexResponse
attachToIndex = forall a. Maybe a
Prelude.Nothing,
      $sel:attachTypedLink:BatchWriteOperationResponse' :: Maybe BatchAttachTypedLinkResponse
attachTypedLink = forall a. Maybe a
Prelude.Nothing,
      $sel:createIndex:BatchWriteOperationResponse' :: Maybe BatchCreateIndexResponse
createIndex = forall a. Maybe a
Prelude.Nothing,
      $sel:createObject:BatchWriteOperationResponse' :: Maybe BatchCreateObjectResponse
createObject = forall a. Maybe a
Prelude.Nothing,
      $sel:deleteObject:BatchWriteOperationResponse' :: Maybe BatchDeleteObjectResponse
deleteObject = forall a. Maybe a
Prelude.Nothing,
      $sel:detachFromIndex:BatchWriteOperationResponse' :: Maybe BatchDetachFromIndexResponse
detachFromIndex = forall a. Maybe a
Prelude.Nothing,
      $sel:detachObject:BatchWriteOperationResponse' :: Maybe BatchDetachObjectResponse
detachObject = forall a. Maybe a
Prelude.Nothing,
      $sel:detachPolicy:BatchWriteOperationResponse' :: Maybe BatchDetachPolicyResponse
detachPolicy = forall a. Maybe a
Prelude.Nothing,
      $sel:detachTypedLink:BatchWriteOperationResponse' :: Maybe BatchDetachTypedLinkResponse
detachTypedLink = forall a. Maybe a
Prelude.Nothing,
      $sel:removeFacetFromObject:BatchWriteOperationResponse' :: Maybe BatchRemoveFacetFromObjectResponse
removeFacetFromObject = forall a. Maybe a
Prelude.Nothing,
      $sel:updateLinkAttributes:BatchWriteOperationResponse' :: Maybe BatchUpdateLinkAttributesResponse
updateLinkAttributes = forall a. Maybe a
Prelude.Nothing,
      $sel:updateObjectAttributes:BatchWriteOperationResponse' :: Maybe BatchUpdateObjectAttributesResponse
updateObjectAttributes = forall a. Maybe a
Prelude.Nothing
    }

-- | The result of an add facet to object batch operation.
batchWriteOperationResponse_addFacetToObject :: Lens.Lens' BatchWriteOperationResponse (Prelude.Maybe BatchAddFacetToObjectResponse)
batchWriteOperationResponse_addFacetToObject :: Lens'
  BatchWriteOperationResponse (Maybe BatchAddFacetToObjectResponse)
batchWriteOperationResponse_addFacetToObject = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchWriteOperationResponse' {Maybe BatchAddFacetToObjectResponse
addFacetToObject :: Maybe BatchAddFacetToObjectResponse
$sel:addFacetToObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchAddFacetToObjectResponse
addFacetToObject} -> Maybe BatchAddFacetToObjectResponse
addFacetToObject) (\s :: BatchWriteOperationResponse
s@BatchWriteOperationResponse' {} Maybe BatchAddFacetToObjectResponse
a -> BatchWriteOperationResponse
s {$sel:addFacetToObject:BatchWriteOperationResponse' :: Maybe BatchAddFacetToObjectResponse
addFacetToObject = Maybe BatchAddFacetToObjectResponse
a} :: BatchWriteOperationResponse)

-- | Attaches an object to a Directory.
batchWriteOperationResponse_attachObject :: Lens.Lens' BatchWriteOperationResponse (Prelude.Maybe BatchAttachObjectResponse)
batchWriteOperationResponse_attachObject :: Lens' BatchWriteOperationResponse (Maybe BatchAttachObjectResponse)
batchWriteOperationResponse_attachObject = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchWriteOperationResponse' {Maybe BatchAttachObjectResponse
attachObject :: Maybe BatchAttachObjectResponse
$sel:attachObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchAttachObjectResponse
attachObject} -> Maybe BatchAttachObjectResponse
attachObject) (\s :: BatchWriteOperationResponse
s@BatchWriteOperationResponse' {} Maybe BatchAttachObjectResponse
a -> BatchWriteOperationResponse
s {$sel:attachObject:BatchWriteOperationResponse' :: Maybe BatchAttachObjectResponse
attachObject = Maybe BatchAttachObjectResponse
a} :: BatchWriteOperationResponse)

-- | Attaches a policy object to a regular object. An object can have a
-- limited number of attached policies.
batchWriteOperationResponse_attachPolicy :: Lens.Lens' BatchWriteOperationResponse (Prelude.Maybe BatchAttachPolicyResponse)
batchWriteOperationResponse_attachPolicy :: Lens' BatchWriteOperationResponse (Maybe BatchAttachPolicyResponse)
batchWriteOperationResponse_attachPolicy = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchWriteOperationResponse' {Maybe BatchAttachPolicyResponse
attachPolicy :: Maybe BatchAttachPolicyResponse
$sel:attachPolicy:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchAttachPolicyResponse
attachPolicy} -> Maybe BatchAttachPolicyResponse
attachPolicy) (\s :: BatchWriteOperationResponse
s@BatchWriteOperationResponse' {} Maybe BatchAttachPolicyResponse
a -> BatchWriteOperationResponse
s {$sel:attachPolicy:BatchWriteOperationResponse' :: Maybe BatchAttachPolicyResponse
attachPolicy = Maybe BatchAttachPolicyResponse
a} :: BatchWriteOperationResponse)

-- | Attaches the specified object to the specified index.
batchWriteOperationResponse_attachToIndex :: Lens.Lens' BatchWriteOperationResponse (Prelude.Maybe BatchAttachToIndexResponse)
batchWriteOperationResponse_attachToIndex :: Lens'
  BatchWriteOperationResponse (Maybe BatchAttachToIndexResponse)
batchWriteOperationResponse_attachToIndex = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchWriteOperationResponse' {Maybe BatchAttachToIndexResponse
attachToIndex :: Maybe BatchAttachToIndexResponse
$sel:attachToIndex:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchAttachToIndexResponse
attachToIndex} -> Maybe BatchAttachToIndexResponse
attachToIndex) (\s :: BatchWriteOperationResponse
s@BatchWriteOperationResponse' {} Maybe BatchAttachToIndexResponse
a -> BatchWriteOperationResponse
s {$sel:attachToIndex:BatchWriteOperationResponse' :: Maybe BatchAttachToIndexResponse
attachToIndex = Maybe BatchAttachToIndexResponse
a} :: BatchWriteOperationResponse)

-- | Attaches a typed link to a specified source and target object. For more
-- information, see
-- <https://docs.aws.amazon.com/clouddirectory/latest/developerguide/directory_objects_links.html#directory_objects_links_typedlink Typed Links>.
batchWriteOperationResponse_attachTypedLink :: Lens.Lens' BatchWriteOperationResponse (Prelude.Maybe BatchAttachTypedLinkResponse)
batchWriteOperationResponse_attachTypedLink :: Lens'
  BatchWriteOperationResponse (Maybe BatchAttachTypedLinkResponse)
batchWriteOperationResponse_attachTypedLink = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchWriteOperationResponse' {Maybe BatchAttachTypedLinkResponse
attachTypedLink :: Maybe BatchAttachTypedLinkResponse
$sel:attachTypedLink:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchAttachTypedLinkResponse
attachTypedLink} -> Maybe BatchAttachTypedLinkResponse
attachTypedLink) (\s :: BatchWriteOperationResponse
s@BatchWriteOperationResponse' {} Maybe BatchAttachTypedLinkResponse
a -> BatchWriteOperationResponse
s {$sel:attachTypedLink:BatchWriteOperationResponse' :: Maybe BatchAttachTypedLinkResponse
attachTypedLink = Maybe BatchAttachTypedLinkResponse
a} :: BatchWriteOperationResponse)

-- | Creates an index object. See
-- <https://docs.aws.amazon.com/clouddirectory/latest/developerguide/indexing_search.htm Indexing and search>
-- for more information.
batchWriteOperationResponse_createIndex :: Lens.Lens' BatchWriteOperationResponse (Prelude.Maybe BatchCreateIndexResponse)
batchWriteOperationResponse_createIndex :: Lens' BatchWriteOperationResponse (Maybe BatchCreateIndexResponse)
batchWriteOperationResponse_createIndex = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchWriteOperationResponse' {Maybe BatchCreateIndexResponse
createIndex :: Maybe BatchCreateIndexResponse
$sel:createIndex:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchCreateIndexResponse
createIndex} -> Maybe BatchCreateIndexResponse
createIndex) (\s :: BatchWriteOperationResponse
s@BatchWriteOperationResponse' {} Maybe BatchCreateIndexResponse
a -> BatchWriteOperationResponse
s {$sel:createIndex:BatchWriteOperationResponse' :: Maybe BatchCreateIndexResponse
createIndex = Maybe BatchCreateIndexResponse
a} :: BatchWriteOperationResponse)

-- | Creates an object in a Directory.
batchWriteOperationResponse_createObject :: Lens.Lens' BatchWriteOperationResponse (Prelude.Maybe BatchCreateObjectResponse)
batchWriteOperationResponse_createObject :: Lens' BatchWriteOperationResponse (Maybe BatchCreateObjectResponse)
batchWriteOperationResponse_createObject = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchWriteOperationResponse' {Maybe BatchCreateObjectResponse
createObject :: Maybe BatchCreateObjectResponse
$sel:createObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchCreateObjectResponse
createObject} -> Maybe BatchCreateObjectResponse
createObject) (\s :: BatchWriteOperationResponse
s@BatchWriteOperationResponse' {} Maybe BatchCreateObjectResponse
a -> BatchWriteOperationResponse
s {$sel:createObject:BatchWriteOperationResponse' :: Maybe BatchCreateObjectResponse
createObject = Maybe BatchCreateObjectResponse
a} :: BatchWriteOperationResponse)

-- | Deletes an object in a Directory.
batchWriteOperationResponse_deleteObject :: Lens.Lens' BatchWriteOperationResponse (Prelude.Maybe BatchDeleteObjectResponse)
batchWriteOperationResponse_deleteObject :: Lens' BatchWriteOperationResponse (Maybe BatchDeleteObjectResponse)
batchWriteOperationResponse_deleteObject = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchWriteOperationResponse' {Maybe BatchDeleteObjectResponse
deleteObject :: Maybe BatchDeleteObjectResponse
$sel:deleteObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchDeleteObjectResponse
deleteObject} -> Maybe BatchDeleteObjectResponse
deleteObject) (\s :: BatchWriteOperationResponse
s@BatchWriteOperationResponse' {} Maybe BatchDeleteObjectResponse
a -> BatchWriteOperationResponse
s {$sel:deleteObject:BatchWriteOperationResponse' :: Maybe BatchDeleteObjectResponse
deleteObject = Maybe BatchDeleteObjectResponse
a} :: BatchWriteOperationResponse)

-- | Detaches the specified object from the specified index.
batchWriteOperationResponse_detachFromIndex :: Lens.Lens' BatchWriteOperationResponse (Prelude.Maybe BatchDetachFromIndexResponse)
batchWriteOperationResponse_detachFromIndex :: Lens'
  BatchWriteOperationResponse (Maybe BatchDetachFromIndexResponse)
batchWriteOperationResponse_detachFromIndex = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchWriteOperationResponse' {Maybe BatchDetachFromIndexResponse
detachFromIndex :: Maybe BatchDetachFromIndexResponse
$sel:detachFromIndex:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchDetachFromIndexResponse
detachFromIndex} -> Maybe BatchDetachFromIndexResponse
detachFromIndex) (\s :: BatchWriteOperationResponse
s@BatchWriteOperationResponse' {} Maybe BatchDetachFromIndexResponse
a -> BatchWriteOperationResponse
s {$sel:detachFromIndex:BatchWriteOperationResponse' :: Maybe BatchDetachFromIndexResponse
detachFromIndex = Maybe BatchDetachFromIndexResponse
a} :: BatchWriteOperationResponse)

-- | Detaches an object from a Directory.
batchWriteOperationResponse_detachObject :: Lens.Lens' BatchWriteOperationResponse (Prelude.Maybe BatchDetachObjectResponse)
batchWriteOperationResponse_detachObject :: Lens' BatchWriteOperationResponse (Maybe BatchDetachObjectResponse)
batchWriteOperationResponse_detachObject = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchWriteOperationResponse' {Maybe BatchDetachObjectResponse
detachObject :: Maybe BatchDetachObjectResponse
$sel:detachObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchDetachObjectResponse
detachObject} -> Maybe BatchDetachObjectResponse
detachObject) (\s :: BatchWriteOperationResponse
s@BatchWriteOperationResponse' {} Maybe BatchDetachObjectResponse
a -> BatchWriteOperationResponse
s {$sel:detachObject:BatchWriteOperationResponse' :: Maybe BatchDetachObjectResponse
detachObject = Maybe BatchDetachObjectResponse
a} :: BatchWriteOperationResponse)

-- | Detaches a policy from a Directory.
batchWriteOperationResponse_detachPolicy :: Lens.Lens' BatchWriteOperationResponse (Prelude.Maybe BatchDetachPolicyResponse)
batchWriteOperationResponse_detachPolicy :: Lens' BatchWriteOperationResponse (Maybe BatchDetachPolicyResponse)
batchWriteOperationResponse_detachPolicy = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchWriteOperationResponse' {Maybe BatchDetachPolicyResponse
detachPolicy :: Maybe BatchDetachPolicyResponse
$sel:detachPolicy:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchDetachPolicyResponse
detachPolicy} -> Maybe BatchDetachPolicyResponse
detachPolicy) (\s :: BatchWriteOperationResponse
s@BatchWriteOperationResponse' {} Maybe BatchDetachPolicyResponse
a -> BatchWriteOperationResponse
s {$sel:detachPolicy:BatchWriteOperationResponse' :: Maybe BatchDetachPolicyResponse
detachPolicy = Maybe BatchDetachPolicyResponse
a} :: BatchWriteOperationResponse)

-- | Detaches a typed link from a specified source and target object. For
-- more information, see
-- <https://docs.aws.amazon.com/clouddirectory/latest/developerguide/directory_objects_links.html#directory_objects_links_typedlink Typed Links>.
batchWriteOperationResponse_detachTypedLink :: Lens.Lens' BatchWriteOperationResponse (Prelude.Maybe BatchDetachTypedLinkResponse)
batchWriteOperationResponse_detachTypedLink :: Lens'
  BatchWriteOperationResponse (Maybe BatchDetachTypedLinkResponse)
batchWriteOperationResponse_detachTypedLink = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchWriteOperationResponse' {Maybe BatchDetachTypedLinkResponse
detachTypedLink :: Maybe BatchDetachTypedLinkResponse
$sel:detachTypedLink:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchDetachTypedLinkResponse
detachTypedLink} -> Maybe BatchDetachTypedLinkResponse
detachTypedLink) (\s :: BatchWriteOperationResponse
s@BatchWriteOperationResponse' {} Maybe BatchDetachTypedLinkResponse
a -> BatchWriteOperationResponse
s {$sel:detachTypedLink:BatchWriteOperationResponse' :: Maybe BatchDetachTypedLinkResponse
detachTypedLink = Maybe BatchDetachTypedLinkResponse
a} :: BatchWriteOperationResponse)

-- | The result of a batch remove facet from object operation.
batchWriteOperationResponse_removeFacetFromObject :: Lens.Lens' BatchWriteOperationResponse (Prelude.Maybe BatchRemoveFacetFromObjectResponse)
batchWriteOperationResponse_removeFacetFromObject :: Lens'
  BatchWriteOperationResponse
  (Maybe BatchRemoveFacetFromObjectResponse)
batchWriteOperationResponse_removeFacetFromObject = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchWriteOperationResponse' {Maybe BatchRemoveFacetFromObjectResponse
removeFacetFromObject :: Maybe BatchRemoveFacetFromObjectResponse
$sel:removeFacetFromObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse
-> Maybe BatchRemoveFacetFromObjectResponse
removeFacetFromObject} -> Maybe BatchRemoveFacetFromObjectResponse
removeFacetFromObject) (\s :: BatchWriteOperationResponse
s@BatchWriteOperationResponse' {} Maybe BatchRemoveFacetFromObjectResponse
a -> BatchWriteOperationResponse
s {$sel:removeFacetFromObject:BatchWriteOperationResponse' :: Maybe BatchRemoveFacetFromObjectResponse
removeFacetFromObject = Maybe BatchRemoveFacetFromObjectResponse
a} :: BatchWriteOperationResponse)

-- | Represents the output of a @BatchWrite@ response operation.
batchWriteOperationResponse_updateLinkAttributes :: Lens.Lens' BatchWriteOperationResponse (Prelude.Maybe BatchUpdateLinkAttributesResponse)
batchWriteOperationResponse_updateLinkAttributes :: Lens'
  BatchWriteOperationResponse
  (Maybe BatchUpdateLinkAttributesResponse)
batchWriteOperationResponse_updateLinkAttributes = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchWriteOperationResponse' {Maybe BatchUpdateLinkAttributesResponse
updateLinkAttributes :: Maybe BatchUpdateLinkAttributesResponse
$sel:updateLinkAttributes:BatchWriteOperationResponse' :: BatchWriteOperationResponse
-> Maybe BatchUpdateLinkAttributesResponse
updateLinkAttributes} -> Maybe BatchUpdateLinkAttributesResponse
updateLinkAttributes) (\s :: BatchWriteOperationResponse
s@BatchWriteOperationResponse' {} Maybe BatchUpdateLinkAttributesResponse
a -> BatchWriteOperationResponse
s {$sel:updateLinkAttributes:BatchWriteOperationResponse' :: Maybe BatchUpdateLinkAttributesResponse
updateLinkAttributes = Maybe BatchUpdateLinkAttributesResponse
a} :: BatchWriteOperationResponse)

-- | Updates a given object’s attributes.
batchWriteOperationResponse_updateObjectAttributes :: Lens.Lens' BatchWriteOperationResponse (Prelude.Maybe BatchUpdateObjectAttributesResponse)
batchWriteOperationResponse_updateObjectAttributes :: Lens'
  BatchWriteOperationResponse
  (Maybe BatchUpdateObjectAttributesResponse)
batchWriteOperationResponse_updateObjectAttributes = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\BatchWriteOperationResponse' {Maybe BatchUpdateObjectAttributesResponse
updateObjectAttributes :: Maybe BatchUpdateObjectAttributesResponse
$sel:updateObjectAttributes:BatchWriteOperationResponse' :: BatchWriteOperationResponse
-> Maybe BatchUpdateObjectAttributesResponse
updateObjectAttributes} -> Maybe BatchUpdateObjectAttributesResponse
updateObjectAttributes) (\s :: BatchWriteOperationResponse
s@BatchWriteOperationResponse' {} Maybe BatchUpdateObjectAttributesResponse
a -> BatchWriteOperationResponse
s {$sel:updateObjectAttributes:BatchWriteOperationResponse' :: Maybe BatchUpdateObjectAttributesResponse
updateObjectAttributes = Maybe BatchUpdateObjectAttributesResponse
a} :: BatchWriteOperationResponse)

instance Data.FromJSON BatchWriteOperationResponse where
  parseJSON :: Value -> Parser BatchWriteOperationResponse
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"BatchWriteOperationResponse"
      ( \Object
x ->
          Maybe BatchAddFacetToObjectResponse
-> Maybe BatchAttachObjectResponse
-> Maybe BatchAttachPolicyResponse
-> Maybe BatchAttachToIndexResponse
-> Maybe BatchAttachTypedLinkResponse
-> Maybe BatchCreateIndexResponse
-> Maybe BatchCreateObjectResponse
-> Maybe BatchDeleteObjectResponse
-> Maybe BatchDetachFromIndexResponse
-> Maybe BatchDetachObjectResponse
-> Maybe BatchDetachPolicyResponse
-> Maybe BatchDetachTypedLinkResponse
-> Maybe BatchRemoveFacetFromObjectResponse
-> Maybe BatchUpdateLinkAttributesResponse
-> Maybe BatchUpdateObjectAttributesResponse
-> BatchWriteOperationResponse
BatchWriteOperationResponse'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"AddFacetToObject")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"AttachObject")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"AttachPolicy")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"AttachToIndex")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"AttachTypedLink")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"CreateIndex")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"CreateObject")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"DeleteObject")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"DetachFromIndex")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"DetachObject")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"DetachPolicy")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"DetachTypedLink")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"RemoveFacetFromObject")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"UpdateLinkAttributes")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"UpdateObjectAttributes")
      )

instance Prelude.Hashable BatchWriteOperationResponse where
  hashWithSalt :: Int -> BatchWriteOperationResponse -> Int
hashWithSalt Int
_salt BatchWriteOperationResponse' {Maybe BatchAddFacetToObjectResponse
Maybe BatchAttachObjectResponse
Maybe BatchAttachPolicyResponse
Maybe BatchAttachToIndexResponse
Maybe BatchCreateIndexResponse
Maybe BatchCreateObjectResponse
Maybe BatchDeleteObjectResponse
Maybe BatchDetachFromIndexResponse
Maybe BatchDetachObjectResponse
Maybe BatchDetachPolicyResponse
Maybe BatchDetachTypedLinkResponse
Maybe BatchRemoveFacetFromObjectResponse
Maybe BatchUpdateLinkAttributesResponse
Maybe BatchUpdateObjectAttributesResponse
Maybe BatchAttachTypedLinkResponse
updateObjectAttributes :: Maybe BatchUpdateObjectAttributesResponse
updateLinkAttributes :: Maybe BatchUpdateLinkAttributesResponse
removeFacetFromObject :: Maybe BatchRemoveFacetFromObjectResponse
detachTypedLink :: Maybe BatchDetachTypedLinkResponse
detachPolicy :: Maybe BatchDetachPolicyResponse
detachObject :: Maybe BatchDetachObjectResponse
detachFromIndex :: Maybe BatchDetachFromIndexResponse
deleteObject :: Maybe BatchDeleteObjectResponse
createObject :: Maybe BatchCreateObjectResponse
createIndex :: Maybe BatchCreateIndexResponse
attachTypedLink :: Maybe BatchAttachTypedLinkResponse
attachToIndex :: Maybe BatchAttachToIndexResponse
attachPolicy :: Maybe BatchAttachPolicyResponse
attachObject :: Maybe BatchAttachObjectResponse
addFacetToObject :: Maybe BatchAddFacetToObjectResponse
$sel:updateObjectAttributes:BatchWriteOperationResponse' :: BatchWriteOperationResponse
-> Maybe BatchUpdateObjectAttributesResponse
$sel:updateLinkAttributes:BatchWriteOperationResponse' :: BatchWriteOperationResponse
-> Maybe BatchUpdateLinkAttributesResponse
$sel:removeFacetFromObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse
-> Maybe BatchRemoveFacetFromObjectResponse
$sel:detachTypedLink:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchDetachTypedLinkResponse
$sel:detachPolicy:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchDetachPolicyResponse
$sel:detachObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchDetachObjectResponse
$sel:detachFromIndex:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchDetachFromIndexResponse
$sel:deleteObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchDeleteObjectResponse
$sel:createObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchCreateObjectResponse
$sel:createIndex:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchCreateIndexResponse
$sel:attachTypedLink:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchAttachTypedLinkResponse
$sel:attachToIndex:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchAttachToIndexResponse
$sel:attachPolicy:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchAttachPolicyResponse
$sel:attachObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchAttachObjectResponse
$sel:addFacetToObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchAddFacetToObjectResponse
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BatchAddFacetToObjectResponse
addFacetToObject
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BatchAttachObjectResponse
attachObject
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BatchAttachPolicyResponse
attachPolicy
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BatchAttachToIndexResponse
attachToIndex
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BatchAttachTypedLinkResponse
attachTypedLink
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BatchCreateIndexResponse
createIndex
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BatchCreateObjectResponse
createObject
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BatchDeleteObjectResponse
deleteObject
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BatchDetachFromIndexResponse
detachFromIndex
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BatchDetachObjectResponse
detachObject
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BatchDetachPolicyResponse
detachPolicy
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BatchDetachTypedLinkResponse
detachTypedLink
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BatchRemoveFacetFromObjectResponse
removeFacetFromObject
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BatchUpdateLinkAttributesResponse
updateLinkAttributes
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BatchUpdateObjectAttributesResponse
updateObjectAttributes

instance Prelude.NFData BatchWriteOperationResponse where
  rnf :: BatchWriteOperationResponse -> ()
rnf BatchWriteOperationResponse' {Maybe BatchAddFacetToObjectResponse
Maybe BatchAttachObjectResponse
Maybe BatchAttachPolicyResponse
Maybe BatchAttachToIndexResponse
Maybe BatchCreateIndexResponse
Maybe BatchCreateObjectResponse
Maybe BatchDeleteObjectResponse
Maybe BatchDetachFromIndexResponse
Maybe BatchDetachObjectResponse
Maybe BatchDetachPolicyResponse
Maybe BatchDetachTypedLinkResponse
Maybe BatchRemoveFacetFromObjectResponse
Maybe BatchUpdateLinkAttributesResponse
Maybe BatchUpdateObjectAttributesResponse
Maybe BatchAttachTypedLinkResponse
updateObjectAttributes :: Maybe BatchUpdateObjectAttributesResponse
updateLinkAttributes :: Maybe BatchUpdateLinkAttributesResponse
removeFacetFromObject :: Maybe BatchRemoveFacetFromObjectResponse
detachTypedLink :: Maybe BatchDetachTypedLinkResponse
detachPolicy :: Maybe BatchDetachPolicyResponse
detachObject :: Maybe BatchDetachObjectResponse
detachFromIndex :: Maybe BatchDetachFromIndexResponse
deleteObject :: Maybe BatchDeleteObjectResponse
createObject :: Maybe BatchCreateObjectResponse
createIndex :: Maybe BatchCreateIndexResponse
attachTypedLink :: Maybe BatchAttachTypedLinkResponse
attachToIndex :: Maybe BatchAttachToIndexResponse
attachPolicy :: Maybe BatchAttachPolicyResponse
attachObject :: Maybe BatchAttachObjectResponse
addFacetToObject :: Maybe BatchAddFacetToObjectResponse
$sel:updateObjectAttributes:BatchWriteOperationResponse' :: BatchWriteOperationResponse
-> Maybe BatchUpdateObjectAttributesResponse
$sel:updateLinkAttributes:BatchWriteOperationResponse' :: BatchWriteOperationResponse
-> Maybe BatchUpdateLinkAttributesResponse
$sel:removeFacetFromObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse
-> Maybe BatchRemoveFacetFromObjectResponse
$sel:detachTypedLink:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchDetachTypedLinkResponse
$sel:detachPolicy:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchDetachPolicyResponse
$sel:detachObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchDetachObjectResponse
$sel:detachFromIndex:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchDetachFromIndexResponse
$sel:deleteObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchDeleteObjectResponse
$sel:createObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchCreateObjectResponse
$sel:createIndex:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchCreateIndexResponse
$sel:attachTypedLink:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchAttachTypedLinkResponse
$sel:attachToIndex:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchAttachToIndexResponse
$sel:attachPolicy:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchAttachPolicyResponse
$sel:attachObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchAttachObjectResponse
$sel:addFacetToObject:BatchWriteOperationResponse' :: BatchWriteOperationResponse -> Maybe BatchAddFacetToObjectResponse
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe BatchAddFacetToObjectResponse
addFacetToObject
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BatchAttachObjectResponse
attachObject
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BatchAttachPolicyResponse
attachPolicy
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BatchAttachToIndexResponse
attachToIndex
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BatchAttachTypedLinkResponse
attachTypedLink
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BatchCreateIndexResponse
createIndex
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BatchCreateObjectResponse
createObject
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BatchDeleteObjectResponse
deleteObject
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BatchDetachFromIndexResponse
detachFromIndex
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BatchDetachObjectResponse
detachObject
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BatchDetachPolicyResponse
detachPolicy
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BatchDetachTypedLinkResponse
detachTypedLink
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BatchRemoveFacetFromObjectResponse
removeFacetFromObject
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BatchUpdateLinkAttributesResponse
updateLinkAttributes
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BatchUpdateObjectAttributesResponse
updateObjectAttributes