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

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

-- |
-- Module      : Amazonka.Kendra.DescribeIndex
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Gets information about an existing Amazon Kendra index.
module Amazonka.Kendra.DescribeIndex
  ( -- * Creating a Request
    DescribeIndex (..),
    newDescribeIndex,

    -- * Request Lenses
    describeIndex_id,

    -- * Destructuring the Response
    DescribeIndexResponse (..),
    newDescribeIndexResponse,

    -- * Response Lenses
    describeIndexResponse_capacityUnits,
    describeIndexResponse_createdAt,
    describeIndexResponse_description,
    describeIndexResponse_documentMetadataConfigurations,
    describeIndexResponse_edition,
    describeIndexResponse_errorMessage,
    describeIndexResponse_id,
    describeIndexResponse_indexStatistics,
    describeIndexResponse_name,
    describeIndexResponse_roleArn,
    describeIndexResponse_serverSideEncryptionConfiguration,
    describeIndexResponse_status,
    describeIndexResponse_updatedAt,
    describeIndexResponse_userContextPolicy,
    describeIndexResponse_userGroupResolutionConfiguration,
    describeIndexResponse_userTokenConfigurations,
    describeIndexResponse_httpStatus,
  )
where

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

-- | /See:/ 'newDescribeIndex' smart constructor.
data DescribeIndex = DescribeIndex'
  { -- | The identifier of the index you want to get information on.
    DescribeIndex -> Text
id :: Prelude.Text
  }
  deriving (DescribeIndex -> DescribeIndex -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeIndex -> DescribeIndex -> Bool
$c/= :: DescribeIndex -> DescribeIndex -> Bool
== :: DescribeIndex -> DescribeIndex -> Bool
$c== :: DescribeIndex -> DescribeIndex -> Bool
Prelude.Eq, ReadPrec [DescribeIndex]
ReadPrec DescribeIndex
Int -> ReadS DescribeIndex
ReadS [DescribeIndex]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeIndex]
$creadListPrec :: ReadPrec [DescribeIndex]
readPrec :: ReadPrec DescribeIndex
$creadPrec :: ReadPrec DescribeIndex
readList :: ReadS [DescribeIndex]
$creadList :: ReadS [DescribeIndex]
readsPrec :: Int -> ReadS DescribeIndex
$creadsPrec :: Int -> ReadS DescribeIndex
Prelude.Read, Int -> DescribeIndex -> ShowS
[DescribeIndex] -> ShowS
DescribeIndex -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeIndex] -> ShowS
$cshowList :: [DescribeIndex] -> ShowS
show :: DescribeIndex -> String
$cshow :: DescribeIndex -> String
showsPrec :: Int -> DescribeIndex -> ShowS
$cshowsPrec :: Int -> DescribeIndex -> ShowS
Prelude.Show, forall x. Rep DescribeIndex x -> DescribeIndex
forall x. DescribeIndex -> Rep DescribeIndex x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DescribeIndex x -> DescribeIndex
$cfrom :: forall x. DescribeIndex -> Rep DescribeIndex x
Prelude.Generic)

-- |
-- Create a value of 'DescribeIndex' 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:
--
-- 'id', 'describeIndex_id' - The identifier of the index you want to get information on.
newDescribeIndex ::
  -- | 'id'
  Prelude.Text ->
  DescribeIndex
newDescribeIndex :: Text -> DescribeIndex
newDescribeIndex Text
pId_ = DescribeIndex' {$sel:id:DescribeIndex' :: Text
id = Text
pId_}

-- | The identifier of the index you want to get information on.
describeIndex_id :: Lens.Lens' DescribeIndex Prelude.Text
describeIndex_id :: Lens' DescribeIndex Text
describeIndex_id = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndex' {Text
id :: Text
$sel:id:DescribeIndex' :: DescribeIndex -> Text
id} -> Text
id) (\s :: DescribeIndex
s@DescribeIndex' {} Text
a -> DescribeIndex
s {$sel:id:DescribeIndex' :: Text
id = Text
a} :: DescribeIndex)

instance Core.AWSRequest DescribeIndex where
  type
    AWSResponse DescribeIndex =
      DescribeIndexResponse
  request :: (Service -> Service) -> DescribeIndex -> Request DescribeIndex
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 DescribeIndex
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse DescribeIndex)))
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 CapacityUnitsConfiguration
-> Maybe POSIX
-> Maybe Text
-> Maybe [DocumentMetadataConfiguration]
-> Maybe IndexEdition
-> Maybe Text
-> Maybe Text
-> Maybe IndexStatistics
-> Maybe Text
-> Maybe Text
-> Maybe ServerSideEncryptionConfiguration
-> Maybe IndexStatus
-> Maybe POSIX
-> Maybe UserContextPolicy
-> Maybe UserGroupResolutionConfiguration
-> Maybe [UserTokenConfiguration]
-> Int
-> DescribeIndexResponse
DescribeIndexResponse'
            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
"CapacityUnits")
            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
"CreatedAt")
            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
"Description")
            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
"DocumentMetadataConfigurations"
                            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
"Edition")
            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
"ErrorMessage")
            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
"Id")
            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
"IndexStatistics")
            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
"Name")
            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
"RoleArn")
            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
"ServerSideEncryptionConfiguration")
            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
"Status")
            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
"UpdatedAt")
            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
"UserContextPolicy")
            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
"UserGroupResolutionConfiguration")
            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
"UserTokenConfigurations"
                            forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ forall a. Monoid a => a
Prelude.mempty
                        )
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure (forall a. Enum a => a -> Int
Prelude.fromEnum Int
s))
      )

instance Prelude.Hashable DescribeIndex where
  hashWithSalt :: Int -> DescribeIndex -> Int
hashWithSalt Int
_salt DescribeIndex' {Text
id :: Text
$sel:id:DescribeIndex' :: DescribeIndex -> Text
..} =
    Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
id

instance Prelude.NFData DescribeIndex where
  rnf :: DescribeIndex -> ()
rnf DescribeIndex' {Text
id :: Text
$sel:id:DescribeIndex' :: DescribeIndex -> Text
..} = forall a. NFData a => a -> ()
Prelude.rnf Text
id

instance Data.ToHeaders DescribeIndex where
  toHeaders :: DescribeIndex -> ResponseHeaders
toHeaders =
    forall a b. a -> b -> a
Prelude.const
      ( forall a. Monoid a => [a] -> a
Prelude.mconcat
          [ HeaderName
"X-Amz-Target"
              forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"AWSKendraFrontendService.DescribeIndex" ::
                          Prelude.ByteString
                      ),
            HeaderName
"Content-Type"
              forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"application/x-amz-json-1.1" ::
                          Prelude.ByteString
                      )
          ]
      )

instance Data.ToJSON DescribeIndex where
  toJSON :: DescribeIndex -> Value
toJSON DescribeIndex' {Text
id :: Text
$sel:id:DescribeIndex' :: DescribeIndex -> Text
..} =
    [Pair] -> Value
Data.object
      (forall a. [Maybe a] -> [a]
Prelude.catMaybes [forall a. a -> Maybe a
Prelude.Just (Key
"Id" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
id)])

instance Data.ToPath DescribeIndex where
  toPath :: DescribeIndex -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/"

instance Data.ToQuery DescribeIndex where
  toQuery :: DescribeIndex -> QueryString
toQuery = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty

-- | /See:/ 'newDescribeIndexResponse' smart constructor.
data DescribeIndexResponse = DescribeIndexResponse'
  { -- | For Enterprise Edition indexes, you can choose to use additional
    -- capacity to meet the needs of your application. This contains the
    -- capacity units used for the index. A query or document storage capacity
    -- of zero indicates that the index is using the default capacity. For more
    -- information on the default capacity for an index and adjusting this, see
    -- <https://docs.aws.amazon.com/kendra/latest/dg/adjusting-capacity.html Adjusting capacity>.
    DescribeIndexResponse -> Maybe CapacityUnitsConfiguration
capacityUnits :: Prelude.Maybe CapacityUnitsConfiguration,
    -- | The Unix datetime that the index was created.
    DescribeIndexResponse -> Maybe POSIX
createdAt :: Prelude.Maybe Data.POSIX,
    -- | The description for the index.
    DescribeIndexResponse -> Maybe Text
description :: Prelude.Maybe Prelude.Text,
    -- | Configuration information for document metadata or fields. Document
    -- metadata are fields or attributes associated with your documents. For
    -- example, the company department name associated with each document.
    DescribeIndexResponse -> Maybe [DocumentMetadataConfiguration]
documentMetadataConfigurations :: Prelude.Maybe [DocumentMetadataConfiguration],
    -- | The Amazon Kendra edition used for the index. You decide the edition
    -- when you create the index.
    DescribeIndexResponse -> Maybe IndexEdition
edition :: Prelude.Maybe IndexEdition,
    -- | When the @Status@ field value is @FAILED@, the @ErrorMessage@ field
    -- contains a message that explains why.
    DescribeIndexResponse -> Maybe Text
errorMessage :: Prelude.Maybe Prelude.Text,
    -- | The identifier of the index.
    DescribeIndexResponse -> Maybe Text
id :: Prelude.Maybe Prelude.Text,
    -- | Provides information about the number of FAQ questions and answers and
    -- the number of text documents indexed.
    DescribeIndexResponse -> Maybe IndexStatistics
indexStatistics :: Prelude.Maybe IndexStatistics,
    -- | The name of the index.
    DescribeIndexResponse -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
    -- | The Amazon Resource Name (ARN) of the IAM role that gives Amazon Kendra
    -- permission to write to your Amazon Cloudwatch logs.
    DescribeIndexResponse -> Maybe Text
roleArn :: Prelude.Maybe Prelude.Text,
    -- | The identifier of the KMScustomer master key (CMK) that is used to
    -- encrypt your data. Amazon Kendra doesn\'t support asymmetric CMKs.
    DescribeIndexResponse -> Maybe ServerSideEncryptionConfiguration
serverSideEncryptionConfiguration :: Prelude.Maybe ServerSideEncryptionConfiguration,
    -- | The current status of the index. When the value is @ACTIVE@, the index
    -- is ready for use. If the @Status@ field value is @FAILED@, the
    -- @ErrorMessage@ field contains a message that explains why.
    DescribeIndexResponse -> Maybe IndexStatus
status :: Prelude.Maybe IndexStatus,
    -- | The Unix datetime that the index was last updated.
    DescribeIndexResponse -> Maybe POSIX
updatedAt :: Prelude.Maybe Data.POSIX,
    -- | The user context policy for the Amazon Kendra index.
    DescribeIndexResponse -> Maybe UserContextPolicy
userContextPolicy :: Prelude.Maybe UserContextPolicy,
    -- | Whether you have enabled the configuration for fetching access levels of
    -- groups and users from an IAM Identity Center (successor to Single
    -- Sign-On) identity source.
    DescribeIndexResponse -> Maybe UserGroupResolutionConfiguration
userGroupResolutionConfiguration :: Prelude.Maybe UserGroupResolutionConfiguration,
    -- | The user token configuration for the Amazon Kendra index.
    DescribeIndexResponse -> Maybe [UserTokenConfiguration]
userTokenConfigurations :: Prelude.Maybe [UserTokenConfiguration],
    -- | The response's http status code.
    DescribeIndexResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (DescribeIndexResponse -> DescribeIndexResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeIndexResponse -> DescribeIndexResponse -> Bool
$c/= :: DescribeIndexResponse -> DescribeIndexResponse -> Bool
== :: DescribeIndexResponse -> DescribeIndexResponse -> Bool
$c== :: DescribeIndexResponse -> DescribeIndexResponse -> Bool
Prelude.Eq, Int -> DescribeIndexResponse -> ShowS
[DescribeIndexResponse] -> ShowS
DescribeIndexResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeIndexResponse] -> ShowS
$cshowList :: [DescribeIndexResponse] -> ShowS
show :: DescribeIndexResponse -> String
$cshow :: DescribeIndexResponse -> String
showsPrec :: Int -> DescribeIndexResponse -> ShowS
$cshowsPrec :: Int -> DescribeIndexResponse -> ShowS
Prelude.Show, forall x. Rep DescribeIndexResponse x -> DescribeIndexResponse
forall x. DescribeIndexResponse -> Rep DescribeIndexResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DescribeIndexResponse x -> DescribeIndexResponse
$cfrom :: forall x. DescribeIndexResponse -> Rep DescribeIndexResponse x
Prelude.Generic)

-- |
-- Create a value of 'DescribeIndexResponse' 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:
--
-- 'capacityUnits', 'describeIndexResponse_capacityUnits' - For Enterprise Edition indexes, you can choose to use additional
-- capacity to meet the needs of your application. This contains the
-- capacity units used for the index. A query or document storage capacity
-- of zero indicates that the index is using the default capacity. For more
-- information on the default capacity for an index and adjusting this, see
-- <https://docs.aws.amazon.com/kendra/latest/dg/adjusting-capacity.html Adjusting capacity>.
--
-- 'createdAt', 'describeIndexResponse_createdAt' - The Unix datetime that the index was created.
--
-- 'description', 'describeIndexResponse_description' - The description for the index.
--
-- 'documentMetadataConfigurations', 'describeIndexResponse_documentMetadataConfigurations' - Configuration information for document metadata or fields. Document
-- metadata are fields or attributes associated with your documents. For
-- example, the company department name associated with each document.
--
-- 'edition', 'describeIndexResponse_edition' - The Amazon Kendra edition used for the index. You decide the edition
-- when you create the index.
--
-- 'errorMessage', 'describeIndexResponse_errorMessage' - When the @Status@ field value is @FAILED@, the @ErrorMessage@ field
-- contains a message that explains why.
--
-- 'id', 'describeIndexResponse_id' - The identifier of the index.
--
-- 'indexStatistics', 'describeIndexResponse_indexStatistics' - Provides information about the number of FAQ questions and answers and
-- the number of text documents indexed.
--
-- 'name', 'describeIndexResponse_name' - The name of the index.
--
-- 'roleArn', 'describeIndexResponse_roleArn' - The Amazon Resource Name (ARN) of the IAM role that gives Amazon Kendra
-- permission to write to your Amazon Cloudwatch logs.
--
-- 'serverSideEncryptionConfiguration', 'describeIndexResponse_serverSideEncryptionConfiguration' - The identifier of the KMScustomer master key (CMK) that is used to
-- encrypt your data. Amazon Kendra doesn\'t support asymmetric CMKs.
--
-- 'status', 'describeIndexResponse_status' - The current status of the index. When the value is @ACTIVE@, the index
-- is ready for use. If the @Status@ field value is @FAILED@, the
-- @ErrorMessage@ field contains a message that explains why.
--
-- 'updatedAt', 'describeIndexResponse_updatedAt' - The Unix datetime that the index was last updated.
--
-- 'userContextPolicy', 'describeIndexResponse_userContextPolicy' - The user context policy for the Amazon Kendra index.
--
-- 'userGroupResolutionConfiguration', 'describeIndexResponse_userGroupResolutionConfiguration' - Whether you have enabled the configuration for fetching access levels of
-- groups and users from an IAM Identity Center (successor to Single
-- Sign-On) identity source.
--
-- 'userTokenConfigurations', 'describeIndexResponse_userTokenConfigurations' - The user token configuration for the Amazon Kendra index.
--
-- 'httpStatus', 'describeIndexResponse_httpStatus' - The response's http status code.
newDescribeIndexResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  DescribeIndexResponse
newDescribeIndexResponse :: Int -> DescribeIndexResponse
newDescribeIndexResponse Int
pHttpStatus_ =
  DescribeIndexResponse'
    { $sel:capacityUnits:DescribeIndexResponse' :: Maybe CapacityUnitsConfiguration
capacityUnits =
        forall a. Maybe a
Prelude.Nothing,
      $sel:createdAt:DescribeIndexResponse' :: Maybe POSIX
createdAt = forall a. Maybe a
Prelude.Nothing,
      $sel:description:DescribeIndexResponse' :: Maybe Text
description = forall a. Maybe a
Prelude.Nothing,
      $sel:documentMetadataConfigurations:DescribeIndexResponse' :: Maybe [DocumentMetadataConfiguration]
documentMetadataConfigurations = forall a. Maybe a
Prelude.Nothing,
      $sel:edition:DescribeIndexResponse' :: Maybe IndexEdition
edition = forall a. Maybe a
Prelude.Nothing,
      $sel:errorMessage:DescribeIndexResponse' :: Maybe Text
errorMessage = forall a. Maybe a
Prelude.Nothing,
      $sel:id:DescribeIndexResponse' :: Maybe Text
id = forall a. Maybe a
Prelude.Nothing,
      $sel:indexStatistics:DescribeIndexResponse' :: Maybe IndexStatistics
indexStatistics = forall a. Maybe a
Prelude.Nothing,
      $sel:name:DescribeIndexResponse' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:roleArn:DescribeIndexResponse' :: Maybe Text
roleArn = forall a. Maybe a
Prelude.Nothing,
      $sel:serverSideEncryptionConfiguration:DescribeIndexResponse' :: Maybe ServerSideEncryptionConfiguration
serverSideEncryptionConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:status:DescribeIndexResponse' :: Maybe IndexStatus
status = forall a. Maybe a
Prelude.Nothing,
      $sel:updatedAt:DescribeIndexResponse' :: Maybe POSIX
updatedAt = forall a. Maybe a
Prelude.Nothing,
      $sel:userContextPolicy:DescribeIndexResponse' :: Maybe UserContextPolicy
userContextPolicy = forall a. Maybe a
Prelude.Nothing,
      $sel:userGroupResolutionConfiguration:DescribeIndexResponse' :: Maybe UserGroupResolutionConfiguration
userGroupResolutionConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:userTokenConfigurations:DescribeIndexResponse' :: Maybe [UserTokenConfiguration]
userTokenConfigurations = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:DescribeIndexResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | For Enterprise Edition indexes, you can choose to use additional
-- capacity to meet the needs of your application. This contains the
-- capacity units used for the index. A query or document storage capacity
-- of zero indicates that the index is using the default capacity. For more
-- information on the default capacity for an index and adjusting this, see
-- <https://docs.aws.amazon.com/kendra/latest/dg/adjusting-capacity.html Adjusting capacity>.
describeIndexResponse_capacityUnits :: Lens.Lens' DescribeIndexResponse (Prelude.Maybe CapacityUnitsConfiguration)
describeIndexResponse_capacityUnits :: Lens' DescribeIndexResponse (Maybe CapacityUnitsConfiguration)
describeIndexResponse_capacityUnits = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Maybe CapacityUnitsConfiguration
capacityUnits :: Maybe CapacityUnitsConfiguration
$sel:capacityUnits:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe CapacityUnitsConfiguration
capacityUnits} -> Maybe CapacityUnitsConfiguration
capacityUnits) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Maybe CapacityUnitsConfiguration
a -> DescribeIndexResponse
s {$sel:capacityUnits:DescribeIndexResponse' :: Maybe CapacityUnitsConfiguration
capacityUnits = Maybe CapacityUnitsConfiguration
a} :: DescribeIndexResponse)

-- | The Unix datetime that the index was created.
describeIndexResponse_createdAt :: Lens.Lens' DescribeIndexResponse (Prelude.Maybe Prelude.UTCTime)
describeIndexResponse_createdAt :: Lens' DescribeIndexResponse (Maybe UTCTime)
describeIndexResponse_createdAt = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Maybe POSIX
createdAt :: Maybe POSIX
$sel:createdAt:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe POSIX
createdAt} -> Maybe POSIX
createdAt) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Maybe POSIX
a -> DescribeIndexResponse
s {$sel:createdAt:DescribeIndexResponse' :: Maybe POSIX
createdAt = Maybe POSIX
a} :: DescribeIndexResponse) 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 :: Format). Iso' (Time a) UTCTime
Data._Time

-- | The description for the index.
describeIndexResponse_description :: Lens.Lens' DescribeIndexResponse (Prelude.Maybe Prelude.Text)
describeIndexResponse_description :: Lens' DescribeIndexResponse (Maybe Text)
describeIndexResponse_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Maybe Text
description :: Maybe Text
$sel:description:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe Text
description} -> Maybe Text
description) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Maybe Text
a -> DescribeIndexResponse
s {$sel:description:DescribeIndexResponse' :: Maybe Text
description = Maybe Text
a} :: DescribeIndexResponse)

-- | Configuration information for document metadata or fields. Document
-- metadata are fields or attributes associated with your documents. For
-- example, the company department name associated with each document.
describeIndexResponse_documentMetadataConfigurations :: Lens.Lens' DescribeIndexResponse (Prelude.Maybe [DocumentMetadataConfiguration])
describeIndexResponse_documentMetadataConfigurations :: Lens' DescribeIndexResponse (Maybe [DocumentMetadataConfiguration])
describeIndexResponse_documentMetadataConfigurations = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Maybe [DocumentMetadataConfiguration]
documentMetadataConfigurations :: Maybe [DocumentMetadataConfiguration]
$sel:documentMetadataConfigurations:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe [DocumentMetadataConfiguration]
documentMetadataConfigurations} -> Maybe [DocumentMetadataConfiguration]
documentMetadataConfigurations) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Maybe [DocumentMetadataConfiguration]
a -> DescribeIndexResponse
s {$sel:documentMetadataConfigurations:DescribeIndexResponse' :: Maybe [DocumentMetadataConfiguration]
documentMetadataConfigurations = Maybe [DocumentMetadataConfiguration]
a} :: DescribeIndexResponse) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The Amazon Kendra edition used for the index. You decide the edition
-- when you create the index.
describeIndexResponse_edition :: Lens.Lens' DescribeIndexResponse (Prelude.Maybe IndexEdition)
describeIndexResponse_edition :: Lens' DescribeIndexResponse (Maybe IndexEdition)
describeIndexResponse_edition = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Maybe IndexEdition
edition :: Maybe IndexEdition
$sel:edition:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe IndexEdition
edition} -> Maybe IndexEdition
edition) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Maybe IndexEdition
a -> DescribeIndexResponse
s {$sel:edition:DescribeIndexResponse' :: Maybe IndexEdition
edition = Maybe IndexEdition
a} :: DescribeIndexResponse)

-- | When the @Status@ field value is @FAILED@, the @ErrorMessage@ field
-- contains a message that explains why.
describeIndexResponse_errorMessage :: Lens.Lens' DescribeIndexResponse (Prelude.Maybe Prelude.Text)
describeIndexResponse_errorMessage :: Lens' DescribeIndexResponse (Maybe Text)
describeIndexResponse_errorMessage = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Maybe Text
errorMessage :: Maybe Text
$sel:errorMessage:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe Text
errorMessage} -> Maybe Text
errorMessage) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Maybe Text
a -> DescribeIndexResponse
s {$sel:errorMessage:DescribeIndexResponse' :: Maybe Text
errorMessage = Maybe Text
a} :: DescribeIndexResponse)

-- | The identifier of the index.
describeIndexResponse_id :: Lens.Lens' DescribeIndexResponse (Prelude.Maybe Prelude.Text)
describeIndexResponse_id :: Lens' DescribeIndexResponse (Maybe Text)
describeIndexResponse_id = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Maybe Text
id :: Maybe Text
$sel:id:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe Text
id} -> Maybe Text
id) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Maybe Text
a -> DescribeIndexResponse
s {$sel:id:DescribeIndexResponse' :: Maybe Text
id = Maybe Text
a} :: DescribeIndexResponse)

-- | Provides information about the number of FAQ questions and answers and
-- the number of text documents indexed.
describeIndexResponse_indexStatistics :: Lens.Lens' DescribeIndexResponse (Prelude.Maybe IndexStatistics)
describeIndexResponse_indexStatistics :: Lens' DescribeIndexResponse (Maybe IndexStatistics)
describeIndexResponse_indexStatistics = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Maybe IndexStatistics
indexStatistics :: Maybe IndexStatistics
$sel:indexStatistics:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe IndexStatistics
indexStatistics} -> Maybe IndexStatistics
indexStatistics) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Maybe IndexStatistics
a -> DescribeIndexResponse
s {$sel:indexStatistics:DescribeIndexResponse' :: Maybe IndexStatistics
indexStatistics = Maybe IndexStatistics
a} :: DescribeIndexResponse)

-- | The name of the index.
describeIndexResponse_name :: Lens.Lens' DescribeIndexResponse (Prelude.Maybe Prelude.Text)
describeIndexResponse_name :: Lens' DescribeIndexResponse (Maybe Text)
describeIndexResponse_name = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Maybe Text
name :: Maybe Text
$sel:name:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe Text
name} -> Maybe Text
name) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Maybe Text
a -> DescribeIndexResponse
s {$sel:name:DescribeIndexResponse' :: Maybe Text
name = Maybe Text
a} :: DescribeIndexResponse)

-- | The Amazon Resource Name (ARN) of the IAM role that gives Amazon Kendra
-- permission to write to your Amazon Cloudwatch logs.
describeIndexResponse_roleArn :: Lens.Lens' DescribeIndexResponse (Prelude.Maybe Prelude.Text)
describeIndexResponse_roleArn :: Lens' DescribeIndexResponse (Maybe Text)
describeIndexResponse_roleArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Maybe Text
roleArn :: Maybe Text
$sel:roleArn:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe Text
roleArn} -> Maybe Text
roleArn) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Maybe Text
a -> DescribeIndexResponse
s {$sel:roleArn:DescribeIndexResponse' :: Maybe Text
roleArn = Maybe Text
a} :: DescribeIndexResponse)

-- | The identifier of the KMScustomer master key (CMK) that is used to
-- encrypt your data. Amazon Kendra doesn\'t support asymmetric CMKs.
describeIndexResponse_serverSideEncryptionConfiguration :: Lens.Lens' DescribeIndexResponse (Prelude.Maybe ServerSideEncryptionConfiguration)
describeIndexResponse_serverSideEncryptionConfiguration :: Lens'
  DescribeIndexResponse (Maybe ServerSideEncryptionConfiguration)
describeIndexResponse_serverSideEncryptionConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Maybe ServerSideEncryptionConfiguration
serverSideEncryptionConfiguration :: Maybe ServerSideEncryptionConfiguration
$sel:serverSideEncryptionConfiguration:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe ServerSideEncryptionConfiguration
serverSideEncryptionConfiguration} -> Maybe ServerSideEncryptionConfiguration
serverSideEncryptionConfiguration) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Maybe ServerSideEncryptionConfiguration
a -> DescribeIndexResponse
s {$sel:serverSideEncryptionConfiguration:DescribeIndexResponse' :: Maybe ServerSideEncryptionConfiguration
serverSideEncryptionConfiguration = Maybe ServerSideEncryptionConfiguration
a} :: DescribeIndexResponse)

-- | The current status of the index. When the value is @ACTIVE@, the index
-- is ready for use. If the @Status@ field value is @FAILED@, the
-- @ErrorMessage@ field contains a message that explains why.
describeIndexResponse_status :: Lens.Lens' DescribeIndexResponse (Prelude.Maybe IndexStatus)
describeIndexResponse_status :: Lens' DescribeIndexResponse (Maybe IndexStatus)
describeIndexResponse_status = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Maybe IndexStatus
status :: Maybe IndexStatus
$sel:status:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe IndexStatus
status} -> Maybe IndexStatus
status) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Maybe IndexStatus
a -> DescribeIndexResponse
s {$sel:status:DescribeIndexResponse' :: Maybe IndexStatus
status = Maybe IndexStatus
a} :: DescribeIndexResponse)

-- | The Unix datetime that the index was last updated.
describeIndexResponse_updatedAt :: Lens.Lens' DescribeIndexResponse (Prelude.Maybe Prelude.UTCTime)
describeIndexResponse_updatedAt :: Lens' DescribeIndexResponse (Maybe UTCTime)
describeIndexResponse_updatedAt = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Maybe POSIX
updatedAt :: Maybe POSIX
$sel:updatedAt:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe POSIX
updatedAt} -> Maybe POSIX
updatedAt) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Maybe POSIX
a -> DescribeIndexResponse
s {$sel:updatedAt:DescribeIndexResponse' :: Maybe POSIX
updatedAt = Maybe POSIX
a} :: DescribeIndexResponse) 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 :: Format). Iso' (Time a) UTCTime
Data._Time

-- | The user context policy for the Amazon Kendra index.
describeIndexResponse_userContextPolicy :: Lens.Lens' DescribeIndexResponse (Prelude.Maybe UserContextPolicy)
describeIndexResponse_userContextPolicy :: Lens' DescribeIndexResponse (Maybe UserContextPolicy)
describeIndexResponse_userContextPolicy = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Maybe UserContextPolicy
userContextPolicy :: Maybe UserContextPolicy
$sel:userContextPolicy:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe UserContextPolicy
userContextPolicy} -> Maybe UserContextPolicy
userContextPolicy) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Maybe UserContextPolicy
a -> DescribeIndexResponse
s {$sel:userContextPolicy:DescribeIndexResponse' :: Maybe UserContextPolicy
userContextPolicy = Maybe UserContextPolicy
a} :: DescribeIndexResponse)

-- | Whether you have enabled the configuration for fetching access levels of
-- groups and users from an IAM Identity Center (successor to Single
-- Sign-On) identity source.
describeIndexResponse_userGroupResolutionConfiguration :: Lens.Lens' DescribeIndexResponse (Prelude.Maybe UserGroupResolutionConfiguration)
describeIndexResponse_userGroupResolutionConfiguration :: Lens'
  DescribeIndexResponse (Maybe UserGroupResolutionConfiguration)
describeIndexResponse_userGroupResolutionConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Maybe UserGroupResolutionConfiguration
userGroupResolutionConfiguration :: Maybe UserGroupResolutionConfiguration
$sel:userGroupResolutionConfiguration:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe UserGroupResolutionConfiguration
userGroupResolutionConfiguration} -> Maybe UserGroupResolutionConfiguration
userGroupResolutionConfiguration) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Maybe UserGroupResolutionConfiguration
a -> DescribeIndexResponse
s {$sel:userGroupResolutionConfiguration:DescribeIndexResponse' :: Maybe UserGroupResolutionConfiguration
userGroupResolutionConfiguration = Maybe UserGroupResolutionConfiguration
a} :: DescribeIndexResponse)

-- | The user token configuration for the Amazon Kendra index.
describeIndexResponse_userTokenConfigurations :: Lens.Lens' DescribeIndexResponse (Prelude.Maybe [UserTokenConfiguration])
describeIndexResponse_userTokenConfigurations :: Lens' DescribeIndexResponse (Maybe [UserTokenConfiguration])
describeIndexResponse_userTokenConfigurations = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Maybe [UserTokenConfiguration]
userTokenConfigurations :: Maybe [UserTokenConfiguration]
$sel:userTokenConfigurations:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe [UserTokenConfiguration]
userTokenConfigurations} -> Maybe [UserTokenConfiguration]
userTokenConfigurations) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Maybe [UserTokenConfiguration]
a -> DescribeIndexResponse
s {$sel:userTokenConfigurations:DescribeIndexResponse' :: Maybe [UserTokenConfiguration]
userTokenConfigurations = Maybe [UserTokenConfiguration]
a} :: DescribeIndexResponse) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The response's http status code.
describeIndexResponse_httpStatus :: Lens.Lens' DescribeIndexResponse Prelude.Int
describeIndexResponse_httpStatus :: Lens' DescribeIndexResponse Int
describeIndexResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeIndexResponse' {Int
httpStatus :: Int
$sel:httpStatus:DescribeIndexResponse' :: DescribeIndexResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: DescribeIndexResponse
s@DescribeIndexResponse' {} Int
a -> DescribeIndexResponse
s {$sel:httpStatus:DescribeIndexResponse' :: Int
httpStatus = Int
a} :: DescribeIndexResponse)

instance Prelude.NFData DescribeIndexResponse where
  rnf :: DescribeIndexResponse -> ()
rnf DescribeIndexResponse' {Int
Maybe [DocumentMetadataConfiguration]
Maybe [UserTokenConfiguration]
Maybe Text
Maybe POSIX
Maybe CapacityUnitsConfiguration
Maybe IndexEdition
Maybe IndexStatus
Maybe ServerSideEncryptionConfiguration
Maybe IndexStatistics
Maybe UserContextPolicy
Maybe UserGroupResolutionConfiguration
httpStatus :: Int
userTokenConfigurations :: Maybe [UserTokenConfiguration]
userGroupResolutionConfiguration :: Maybe UserGroupResolutionConfiguration
userContextPolicy :: Maybe UserContextPolicy
updatedAt :: Maybe POSIX
status :: Maybe IndexStatus
serverSideEncryptionConfiguration :: Maybe ServerSideEncryptionConfiguration
roleArn :: Maybe Text
name :: Maybe Text
indexStatistics :: Maybe IndexStatistics
id :: Maybe Text
errorMessage :: Maybe Text
edition :: Maybe IndexEdition
documentMetadataConfigurations :: Maybe [DocumentMetadataConfiguration]
description :: Maybe Text
createdAt :: Maybe POSIX
capacityUnits :: Maybe CapacityUnitsConfiguration
$sel:httpStatus:DescribeIndexResponse' :: DescribeIndexResponse -> Int
$sel:userTokenConfigurations:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe [UserTokenConfiguration]
$sel:userGroupResolutionConfiguration:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe UserGroupResolutionConfiguration
$sel:userContextPolicy:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe UserContextPolicy
$sel:updatedAt:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe POSIX
$sel:status:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe IndexStatus
$sel:serverSideEncryptionConfiguration:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe ServerSideEncryptionConfiguration
$sel:roleArn:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe Text
$sel:name:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe Text
$sel:indexStatistics:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe IndexStatistics
$sel:id:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe Text
$sel:errorMessage:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe Text
$sel:edition:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe IndexEdition
$sel:documentMetadataConfigurations:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe [DocumentMetadataConfiguration]
$sel:description:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe Text
$sel:createdAt:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe POSIX
$sel:capacityUnits:DescribeIndexResponse' :: DescribeIndexResponse -> Maybe CapacityUnitsConfiguration
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe CapacityUnitsConfiguration
capacityUnits
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
createdAt
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
description
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [DocumentMetadataConfiguration]
documentMetadataConfigurations
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe IndexEdition
edition
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
errorMessage
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
id
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe IndexStatistics
indexStatistics
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
name
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
roleArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ServerSideEncryptionConfiguration
serverSideEncryptionConfiguration
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe IndexStatus
status
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
updatedAt
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe UserContextPolicy
userContextPolicy
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe UserGroupResolutionConfiguration
userGroupResolutionConfiguration
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [UserTokenConfiguration]
userTokenConfigurations
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus