{-# 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.Backup.GetBackupVaultAccessPolicy
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Returns the access policy document that is associated with the named
-- backup vault.
module Amazonka.Backup.GetBackupVaultAccessPolicy
  ( -- * Creating a Request
    GetBackupVaultAccessPolicy (..),
    newGetBackupVaultAccessPolicy,

    -- * Request Lenses
    getBackupVaultAccessPolicy_backupVaultName,

    -- * Destructuring the Response
    GetBackupVaultAccessPolicyResponse (..),
    newGetBackupVaultAccessPolicyResponse,

    -- * Response Lenses
    getBackupVaultAccessPolicyResponse_backupVaultArn,
    getBackupVaultAccessPolicyResponse_backupVaultName,
    getBackupVaultAccessPolicyResponse_policy,
    getBackupVaultAccessPolicyResponse_httpStatus,
  )
where

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

-- | /See:/ 'newGetBackupVaultAccessPolicy' smart constructor.
data GetBackupVaultAccessPolicy = GetBackupVaultAccessPolicy'
  { -- | The name of a logical container where backups are stored. Backup vaults
    -- are identified by names that are unique to the account used to create
    -- them and the Amazon Web Services Region where they are created. They
    -- consist of lowercase letters, numbers, and hyphens.
    GetBackupVaultAccessPolicy -> Text
backupVaultName :: Prelude.Text
  }
  deriving (GetBackupVaultAccessPolicy -> GetBackupVaultAccessPolicy -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetBackupVaultAccessPolicy -> GetBackupVaultAccessPolicy -> Bool
$c/= :: GetBackupVaultAccessPolicy -> GetBackupVaultAccessPolicy -> Bool
== :: GetBackupVaultAccessPolicy -> GetBackupVaultAccessPolicy -> Bool
$c== :: GetBackupVaultAccessPolicy -> GetBackupVaultAccessPolicy -> Bool
Prelude.Eq, ReadPrec [GetBackupVaultAccessPolicy]
ReadPrec GetBackupVaultAccessPolicy
Int -> ReadS GetBackupVaultAccessPolicy
ReadS [GetBackupVaultAccessPolicy]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetBackupVaultAccessPolicy]
$creadListPrec :: ReadPrec [GetBackupVaultAccessPolicy]
readPrec :: ReadPrec GetBackupVaultAccessPolicy
$creadPrec :: ReadPrec GetBackupVaultAccessPolicy
readList :: ReadS [GetBackupVaultAccessPolicy]
$creadList :: ReadS [GetBackupVaultAccessPolicy]
readsPrec :: Int -> ReadS GetBackupVaultAccessPolicy
$creadsPrec :: Int -> ReadS GetBackupVaultAccessPolicy
Prelude.Read, Int -> GetBackupVaultAccessPolicy -> ShowS
[GetBackupVaultAccessPolicy] -> ShowS
GetBackupVaultAccessPolicy -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetBackupVaultAccessPolicy] -> ShowS
$cshowList :: [GetBackupVaultAccessPolicy] -> ShowS
show :: GetBackupVaultAccessPolicy -> String
$cshow :: GetBackupVaultAccessPolicy -> String
showsPrec :: Int -> GetBackupVaultAccessPolicy -> ShowS
$cshowsPrec :: Int -> GetBackupVaultAccessPolicy -> ShowS
Prelude.Show, forall x.
Rep GetBackupVaultAccessPolicy x -> GetBackupVaultAccessPolicy
forall x.
GetBackupVaultAccessPolicy -> Rep GetBackupVaultAccessPolicy x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep GetBackupVaultAccessPolicy x -> GetBackupVaultAccessPolicy
$cfrom :: forall x.
GetBackupVaultAccessPolicy -> Rep GetBackupVaultAccessPolicy x
Prelude.Generic)

-- |
-- Create a value of 'GetBackupVaultAccessPolicy' 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:
--
-- 'backupVaultName', 'getBackupVaultAccessPolicy_backupVaultName' - The name of a logical container where backups are stored. Backup vaults
-- are identified by names that are unique to the account used to create
-- them and the Amazon Web Services Region where they are created. They
-- consist of lowercase letters, numbers, and hyphens.
newGetBackupVaultAccessPolicy ::
  -- | 'backupVaultName'
  Prelude.Text ->
  GetBackupVaultAccessPolicy
newGetBackupVaultAccessPolicy :: Text -> GetBackupVaultAccessPolicy
newGetBackupVaultAccessPolicy Text
pBackupVaultName_ =
  GetBackupVaultAccessPolicy'
    { $sel:backupVaultName:GetBackupVaultAccessPolicy' :: Text
backupVaultName =
        Text
pBackupVaultName_
    }

-- | The name of a logical container where backups are stored. Backup vaults
-- are identified by names that are unique to the account used to create
-- them and the Amazon Web Services Region where they are created. They
-- consist of lowercase letters, numbers, and hyphens.
getBackupVaultAccessPolicy_backupVaultName :: Lens.Lens' GetBackupVaultAccessPolicy Prelude.Text
getBackupVaultAccessPolicy_backupVaultName :: Lens' GetBackupVaultAccessPolicy Text
getBackupVaultAccessPolicy_backupVaultName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBackupVaultAccessPolicy' {Text
backupVaultName :: Text
$sel:backupVaultName:GetBackupVaultAccessPolicy' :: GetBackupVaultAccessPolicy -> Text
backupVaultName} -> Text
backupVaultName) (\s :: GetBackupVaultAccessPolicy
s@GetBackupVaultAccessPolicy' {} Text
a -> GetBackupVaultAccessPolicy
s {$sel:backupVaultName:GetBackupVaultAccessPolicy' :: Text
backupVaultName = Text
a} :: GetBackupVaultAccessPolicy)

instance Core.AWSRequest GetBackupVaultAccessPolicy where
  type
    AWSResponse GetBackupVaultAccessPolicy =
      GetBackupVaultAccessPolicyResponse
  request :: (Service -> Service)
-> GetBackupVaultAccessPolicy -> Request GetBackupVaultAccessPolicy
request Service -> Service
overrides =
    forall a. ToRequest a => Service -> a -> Request a
Request.get (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy GetBackupVaultAccessPolicy
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse GetBackupVaultAccessPolicy)))
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
-> Maybe Text
-> Maybe Text
-> Int
-> GetBackupVaultAccessPolicyResponse
GetBackupVaultAccessPolicyResponse'
            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
"BackupVaultArn")
            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
"BackupVaultName")
            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
"Policy")
            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 GetBackupVaultAccessPolicy where
  hashWithSalt :: Int -> GetBackupVaultAccessPolicy -> Int
hashWithSalt Int
_salt GetBackupVaultAccessPolicy' {Text
backupVaultName :: Text
$sel:backupVaultName:GetBackupVaultAccessPolicy' :: GetBackupVaultAccessPolicy -> Text
..} =
    Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
backupVaultName

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

instance Data.ToHeaders GetBackupVaultAccessPolicy where
  toHeaders :: GetBackupVaultAccessPolicy -> 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.ToPath GetBackupVaultAccessPolicy where
  toPath :: GetBackupVaultAccessPolicy -> ByteString
toPath GetBackupVaultAccessPolicy' {Text
backupVaultName :: Text
$sel:backupVaultName:GetBackupVaultAccessPolicy' :: GetBackupVaultAccessPolicy -> Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"/backup-vaults/",
        forall a. ToByteString a => a -> ByteString
Data.toBS Text
backupVaultName,
        ByteString
"/access-policy"
      ]

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

-- | /See:/ 'newGetBackupVaultAccessPolicyResponse' smart constructor.
data GetBackupVaultAccessPolicyResponse = GetBackupVaultAccessPolicyResponse'
  { -- | An Amazon Resource Name (ARN) that uniquely identifies a backup vault;
    -- for example, @arn:aws:backup:us-east-1:123456789012:vault:aBackupVault@.
    GetBackupVaultAccessPolicyResponse -> Maybe Text
backupVaultArn :: Prelude.Maybe Prelude.Text,
    -- | The name of a logical container where backups are stored. Backup vaults
    -- are identified by names that are unique to the account used to create
    -- them and the Region where they are created. They consist of lowercase
    -- letters, numbers, and hyphens.
    GetBackupVaultAccessPolicyResponse -> Maybe Text
backupVaultName :: Prelude.Maybe Prelude.Text,
    -- | The backup vault access policy document in JSON format.
    GetBackupVaultAccessPolicyResponse -> Maybe Text
policy :: Prelude.Maybe Prelude.Text,
    -- | The response's http status code.
    GetBackupVaultAccessPolicyResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (GetBackupVaultAccessPolicyResponse
-> GetBackupVaultAccessPolicyResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetBackupVaultAccessPolicyResponse
-> GetBackupVaultAccessPolicyResponse -> Bool
$c/= :: GetBackupVaultAccessPolicyResponse
-> GetBackupVaultAccessPolicyResponse -> Bool
== :: GetBackupVaultAccessPolicyResponse
-> GetBackupVaultAccessPolicyResponse -> Bool
$c== :: GetBackupVaultAccessPolicyResponse
-> GetBackupVaultAccessPolicyResponse -> Bool
Prelude.Eq, ReadPrec [GetBackupVaultAccessPolicyResponse]
ReadPrec GetBackupVaultAccessPolicyResponse
Int -> ReadS GetBackupVaultAccessPolicyResponse
ReadS [GetBackupVaultAccessPolicyResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetBackupVaultAccessPolicyResponse]
$creadListPrec :: ReadPrec [GetBackupVaultAccessPolicyResponse]
readPrec :: ReadPrec GetBackupVaultAccessPolicyResponse
$creadPrec :: ReadPrec GetBackupVaultAccessPolicyResponse
readList :: ReadS [GetBackupVaultAccessPolicyResponse]
$creadList :: ReadS [GetBackupVaultAccessPolicyResponse]
readsPrec :: Int -> ReadS GetBackupVaultAccessPolicyResponse
$creadsPrec :: Int -> ReadS GetBackupVaultAccessPolicyResponse
Prelude.Read, Int -> GetBackupVaultAccessPolicyResponse -> ShowS
[GetBackupVaultAccessPolicyResponse] -> ShowS
GetBackupVaultAccessPolicyResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetBackupVaultAccessPolicyResponse] -> ShowS
$cshowList :: [GetBackupVaultAccessPolicyResponse] -> ShowS
show :: GetBackupVaultAccessPolicyResponse -> String
$cshow :: GetBackupVaultAccessPolicyResponse -> String
showsPrec :: Int -> GetBackupVaultAccessPolicyResponse -> ShowS
$cshowsPrec :: Int -> GetBackupVaultAccessPolicyResponse -> ShowS
Prelude.Show, forall x.
Rep GetBackupVaultAccessPolicyResponse x
-> GetBackupVaultAccessPolicyResponse
forall x.
GetBackupVaultAccessPolicyResponse
-> Rep GetBackupVaultAccessPolicyResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep GetBackupVaultAccessPolicyResponse x
-> GetBackupVaultAccessPolicyResponse
$cfrom :: forall x.
GetBackupVaultAccessPolicyResponse
-> Rep GetBackupVaultAccessPolicyResponse x
Prelude.Generic)

-- |
-- Create a value of 'GetBackupVaultAccessPolicyResponse' 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:
--
-- 'backupVaultArn', 'getBackupVaultAccessPolicyResponse_backupVaultArn' - An Amazon Resource Name (ARN) that uniquely identifies a backup vault;
-- for example, @arn:aws:backup:us-east-1:123456789012:vault:aBackupVault@.
--
-- 'backupVaultName', 'getBackupVaultAccessPolicyResponse_backupVaultName' - The name of a logical container where backups are stored. Backup vaults
-- are identified by names that are unique to the account used to create
-- them and the Region where they are created. They consist of lowercase
-- letters, numbers, and hyphens.
--
-- 'policy', 'getBackupVaultAccessPolicyResponse_policy' - The backup vault access policy document in JSON format.
--
-- 'httpStatus', 'getBackupVaultAccessPolicyResponse_httpStatus' - The response's http status code.
newGetBackupVaultAccessPolicyResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  GetBackupVaultAccessPolicyResponse
newGetBackupVaultAccessPolicyResponse :: Int -> GetBackupVaultAccessPolicyResponse
newGetBackupVaultAccessPolicyResponse Int
pHttpStatus_ =
  GetBackupVaultAccessPolicyResponse'
    { $sel:backupVaultArn:GetBackupVaultAccessPolicyResponse' :: Maybe Text
backupVaultArn =
        forall a. Maybe a
Prelude.Nothing,
      $sel:backupVaultName:GetBackupVaultAccessPolicyResponse' :: Maybe Text
backupVaultName = forall a. Maybe a
Prelude.Nothing,
      $sel:policy:GetBackupVaultAccessPolicyResponse' :: Maybe Text
policy = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:GetBackupVaultAccessPolicyResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | An Amazon Resource Name (ARN) that uniquely identifies a backup vault;
-- for example, @arn:aws:backup:us-east-1:123456789012:vault:aBackupVault@.
getBackupVaultAccessPolicyResponse_backupVaultArn :: Lens.Lens' GetBackupVaultAccessPolicyResponse (Prelude.Maybe Prelude.Text)
getBackupVaultAccessPolicyResponse_backupVaultArn :: Lens' GetBackupVaultAccessPolicyResponse (Maybe Text)
getBackupVaultAccessPolicyResponse_backupVaultArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBackupVaultAccessPolicyResponse' {Maybe Text
backupVaultArn :: Maybe Text
$sel:backupVaultArn:GetBackupVaultAccessPolicyResponse' :: GetBackupVaultAccessPolicyResponse -> Maybe Text
backupVaultArn} -> Maybe Text
backupVaultArn) (\s :: GetBackupVaultAccessPolicyResponse
s@GetBackupVaultAccessPolicyResponse' {} Maybe Text
a -> GetBackupVaultAccessPolicyResponse
s {$sel:backupVaultArn:GetBackupVaultAccessPolicyResponse' :: Maybe Text
backupVaultArn = Maybe Text
a} :: GetBackupVaultAccessPolicyResponse)

-- | The name of a logical container where backups are stored. Backup vaults
-- are identified by names that are unique to the account used to create
-- them and the Region where they are created. They consist of lowercase
-- letters, numbers, and hyphens.
getBackupVaultAccessPolicyResponse_backupVaultName :: Lens.Lens' GetBackupVaultAccessPolicyResponse (Prelude.Maybe Prelude.Text)
getBackupVaultAccessPolicyResponse_backupVaultName :: Lens' GetBackupVaultAccessPolicyResponse (Maybe Text)
getBackupVaultAccessPolicyResponse_backupVaultName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBackupVaultAccessPolicyResponse' {Maybe Text
backupVaultName :: Maybe Text
$sel:backupVaultName:GetBackupVaultAccessPolicyResponse' :: GetBackupVaultAccessPolicyResponse -> Maybe Text
backupVaultName} -> Maybe Text
backupVaultName) (\s :: GetBackupVaultAccessPolicyResponse
s@GetBackupVaultAccessPolicyResponse' {} Maybe Text
a -> GetBackupVaultAccessPolicyResponse
s {$sel:backupVaultName:GetBackupVaultAccessPolicyResponse' :: Maybe Text
backupVaultName = Maybe Text
a} :: GetBackupVaultAccessPolicyResponse)

-- | The backup vault access policy document in JSON format.
getBackupVaultAccessPolicyResponse_policy :: Lens.Lens' GetBackupVaultAccessPolicyResponse (Prelude.Maybe Prelude.Text)
getBackupVaultAccessPolicyResponse_policy :: Lens' GetBackupVaultAccessPolicyResponse (Maybe Text)
getBackupVaultAccessPolicyResponse_policy = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBackupVaultAccessPolicyResponse' {Maybe Text
policy :: Maybe Text
$sel:policy:GetBackupVaultAccessPolicyResponse' :: GetBackupVaultAccessPolicyResponse -> Maybe Text
policy} -> Maybe Text
policy) (\s :: GetBackupVaultAccessPolicyResponse
s@GetBackupVaultAccessPolicyResponse' {} Maybe Text
a -> GetBackupVaultAccessPolicyResponse
s {$sel:policy:GetBackupVaultAccessPolicyResponse' :: Maybe Text
policy = Maybe Text
a} :: GetBackupVaultAccessPolicyResponse)

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

instance
  Prelude.NFData
    GetBackupVaultAccessPolicyResponse
  where
  rnf :: GetBackupVaultAccessPolicyResponse -> ()
rnf GetBackupVaultAccessPolicyResponse' {Int
Maybe Text
httpStatus :: Int
policy :: Maybe Text
backupVaultName :: Maybe Text
backupVaultArn :: Maybe Text
$sel:httpStatus:GetBackupVaultAccessPolicyResponse' :: GetBackupVaultAccessPolicyResponse -> Int
$sel:policy:GetBackupVaultAccessPolicyResponse' :: GetBackupVaultAccessPolicyResponse -> Maybe Text
$sel:backupVaultName:GetBackupVaultAccessPolicyResponse' :: GetBackupVaultAccessPolicyResponse -> Maybe Text
$sel:backupVaultArn:GetBackupVaultAccessPolicyResponse' :: GetBackupVaultAccessPolicyResponse -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
backupVaultArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
backupVaultName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
policy
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus