{-# 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.SSOAdmin.AttachCustomerManagedPolicyReferenceToPermissionSet
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Attaches the specified customer managed policy to the specified
-- PermissionSet.
module Amazonka.SSOAdmin.AttachCustomerManagedPolicyReferenceToPermissionSet
  ( -- * Creating a Request
    AttachCustomerManagedPolicyReferenceToPermissionSet (..),
    newAttachCustomerManagedPolicyReferenceToPermissionSet,

    -- * Request Lenses
    attachCustomerManagedPolicyReferenceToPermissionSet_instanceArn,
    attachCustomerManagedPolicyReferenceToPermissionSet_permissionSetArn,
    attachCustomerManagedPolicyReferenceToPermissionSet_customerManagedPolicyReference,

    -- * Destructuring the Response
    AttachCustomerManagedPolicyReferenceToPermissionSetResponse (..),
    newAttachCustomerManagedPolicyReferenceToPermissionSetResponse,

    -- * Response Lenses
    attachCustomerManagedPolicyReferenceToPermissionSetResponse_httpStatus,
  )
where

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

-- | /See:/ 'newAttachCustomerManagedPolicyReferenceToPermissionSet' smart constructor.
data AttachCustomerManagedPolicyReferenceToPermissionSet = AttachCustomerManagedPolicyReferenceToPermissionSet'
  { -- | The ARN of the IAM Identity Center instance under which the operation
    -- will be executed.
    AttachCustomerManagedPolicyReferenceToPermissionSet -> Text
instanceArn :: Prelude.Text,
    -- | The ARN of the @PermissionSet@.
    AttachCustomerManagedPolicyReferenceToPermissionSet -> Text
permissionSetArn :: Prelude.Text,
    -- | Specifies the name and path of a customer managed policy. You must have
    -- an IAM policy that matches the name and path in each AWS account where
    -- you want to deploy your permission set.
    AttachCustomerManagedPolicyReferenceToPermissionSet
-> CustomerManagedPolicyReference
customerManagedPolicyReference :: CustomerManagedPolicyReference
  }
  deriving (AttachCustomerManagedPolicyReferenceToPermissionSet
-> AttachCustomerManagedPolicyReferenceToPermissionSet -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: AttachCustomerManagedPolicyReferenceToPermissionSet
-> AttachCustomerManagedPolicyReferenceToPermissionSet -> Bool
$c/= :: AttachCustomerManagedPolicyReferenceToPermissionSet
-> AttachCustomerManagedPolicyReferenceToPermissionSet -> Bool
== :: AttachCustomerManagedPolicyReferenceToPermissionSet
-> AttachCustomerManagedPolicyReferenceToPermissionSet -> Bool
$c== :: AttachCustomerManagedPolicyReferenceToPermissionSet
-> AttachCustomerManagedPolicyReferenceToPermissionSet -> Bool
Prelude.Eq, ReadPrec [AttachCustomerManagedPolicyReferenceToPermissionSet]
ReadPrec AttachCustomerManagedPolicyReferenceToPermissionSet
Int -> ReadS AttachCustomerManagedPolicyReferenceToPermissionSet
ReadS [AttachCustomerManagedPolicyReferenceToPermissionSet]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [AttachCustomerManagedPolicyReferenceToPermissionSet]
$creadListPrec :: ReadPrec [AttachCustomerManagedPolicyReferenceToPermissionSet]
readPrec :: ReadPrec AttachCustomerManagedPolicyReferenceToPermissionSet
$creadPrec :: ReadPrec AttachCustomerManagedPolicyReferenceToPermissionSet
readList :: ReadS [AttachCustomerManagedPolicyReferenceToPermissionSet]
$creadList :: ReadS [AttachCustomerManagedPolicyReferenceToPermissionSet]
readsPrec :: Int -> ReadS AttachCustomerManagedPolicyReferenceToPermissionSet
$creadsPrec :: Int -> ReadS AttachCustomerManagedPolicyReferenceToPermissionSet
Prelude.Read, Int -> AttachCustomerManagedPolicyReferenceToPermissionSet -> ShowS
[AttachCustomerManagedPolicyReferenceToPermissionSet] -> ShowS
AttachCustomerManagedPolicyReferenceToPermissionSet -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [AttachCustomerManagedPolicyReferenceToPermissionSet] -> ShowS
$cshowList :: [AttachCustomerManagedPolicyReferenceToPermissionSet] -> ShowS
show :: AttachCustomerManagedPolicyReferenceToPermissionSet -> String
$cshow :: AttachCustomerManagedPolicyReferenceToPermissionSet -> String
showsPrec :: Int -> AttachCustomerManagedPolicyReferenceToPermissionSet -> ShowS
$cshowsPrec :: Int -> AttachCustomerManagedPolicyReferenceToPermissionSet -> ShowS
Prelude.Show, forall x.
Rep AttachCustomerManagedPolicyReferenceToPermissionSet x
-> AttachCustomerManagedPolicyReferenceToPermissionSet
forall x.
AttachCustomerManagedPolicyReferenceToPermissionSet
-> Rep AttachCustomerManagedPolicyReferenceToPermissionSet x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep AttachCustomerManagedPolicyReferenceToPermissionSet x
-> AttachCustomerManagedPolicyReferenceToPermissionSet
$cfrom :: forall x.
AttachCustomerManagedPolicyReferenceToPermissionSet
-> Rep AttachCustomerManagedPolicyReferenceToPermissionSet x
Prelude.Generic)

-- |
-- Create a value of 'AttachCustomerManagedPolicyReferenceToPermissionSet' 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:
--
-- 'instanceArn', 'attachCustomerManagedPolicyReferenceToPermissionSet_instanceArn' - The ARN of the IAM Identity Center instance under which the operation
-- will be executed.
--
-- 'permissionSetArn', 'attachCustomerManagedPolicyReferenceToPermissionSet_permissionSetArn' - The ARN of the @PermissionSet@.
--
-- 'customerManagedPolicyReference', 'attachCustomerManagedPolicyReferenceToPermissionSet_customerManagedPolicyReference' - Specifies the name and path of a customer managed policy. You must have
-- an IAM policy that matches the name and path in each AWS account where
-- you want to deploy your permission set.
newAttachCustomerManagedPolicyReferenceToPermissionSet ::
  -- | 'instanceArn'
  Prelude.Text ->
  -- | 'permissionSetArn'
  Prelude.Text ->
  -- | 'customerManagedPolicyReference'
  CustomerManagedPolicyReference ->
  AttachCustomerManagedPolicyReferenceToPermissionSet
newAttachCustomerManagedPolicyReferenceToPermissionSet :: Text
-> Text
-> CustomerManagedPolicyReference
-> AttachCustomerManagedPolicyReferenceToPermissionSet
newAttachCustomerManagedPolicyReferenceToPermissionSet
  Text
pInstanceArn_
  Text
pPermissionSetArn_
  CustomerManagedPolicyReference
pCustomerManagedPolicyReference_ =
    AttachCustomerManagedPolicyReferenceToPermissionSet'
      { $sel:instanceArn:AttachCustomerManagedPolicyReferenceToPermissionSet' :: Text
instanceArn =
          Text
pInstanceArn_,
        $sel:permissionSetArn:AttachCustomerManagedPolicyReferenceToPermissionSet' :: Text
permissionSetArn =
          Text
pPermissionSetArn_,
        $sel:customerManagedPolicyReference:AttachCustomerManagedPolicyReferenceToPermissionSet' :: CustomerManagedPolicyReference
customerManagedPolicyReference =
          CustomerManagedPolicyReference
pCustomerManagedPolicyReference_
      }

-- | The ARN of the IAM Identity Center instance under which the operation
-- will be executed.
attachCustomerManagedPolicyReferenceToPermissionSet_instanceArn :: Lens.Lens' AttachCustomerManagedPolicyReferenceToPermissionSet Prelude.Text
attachCustomerManagedPolicyReferenceToPermissionSet_instanceArn :: Lens' AttachCustomerManagedPolicyReferenceToPermissionSet Text
attachCustomerManagedPolicyReferenceToPermissionSet_instanceArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\AttachCustomerManagedPolicyReferenceToPermissionSet' {Text
instanceArn :: Text
$sel:instanceArn:AttachCustomerManagedPolicyReferenceToPermissionSet' :: AttachCustomerManagedPolicyReferenceToPermissionSet -> Text
instanceArn} -> Text
instanceArn) (\s :: AttachCustomerManagedPolicyReferenceToPermissionSet
s@AttachCustomerManagedPolicyReferenceToPermissionSet' {} Text
a -> AttachCustomerManagedPolicyReferenceToPermissionSet
s {$sel:instanceArn:AttachCustomerManagedPolicyReferenceToPermissionSet' :: Text
instanceArn = Text
a} :: AttachCustomerManagedPolicyReferenceToPermissionSet)

-- | The ARN of the @PermissionSet@.
attachCustomerManagedPolicyReferenceToPermissionSet_permissionSetArn :: Lens.Lens' AttachCustomerManagedPolicyReferenceToPermissionSet Prelude.Text
attachCustomerManagedPolicyReferenceToPermissionSet_permissionSetArn :: Lens' AttachCustomerManagedPolicyReferenceToPermissionSet Text
attachCustomerManagedPolicyReferenceToPermissionSet_permissionSetArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\AttachCustomerManagedPolicyReferenceToPermissionSet' {Text
permissionSetArn :: Text
$sel:permissionSetArn:AttachCustomerManagedPolicyReferenceToPermissionSet' :: AttachCustomerManagedPolicyReferenceToPermissionSet -> Text
permissionSetArn} -> Text
permissionSetArn) (\s :: AttachCustomerManagedPolicyReferenceToPermissionSet
s@AttachCustomerManagedPolicyReferenceToPermissionSet' {} Text
a -> AttachCustomerManagedPolicyReferenceToPermissionSet
s {$sel:permissionSetArn:AttachCustomerManagedPolicyReferenceToPermissionSet' :: Text
permissionSetArn = Text
a} :: AttachCustomerManagedPolicyReferenceToPermissionSet)

-- | Specifies the name and path of a customer managed policy. You must have
-- an IAM policy that matches the name and path in each AWS account where
-- you want to deploy your permission set.
attachCustomerManagedPolicyReferenceToPermissionSet_customerManagedPolicyReference :: Lens.Lens' AttachCustomerManagedPolicyReferenceToPermissionSet CustomerManagedPolicyReference
attachCustomerManagedPolicyReferenceToPermissionSet_customerManagedPolicyReference :: Lens'
  AttachCustomerManagedPolicyReferenceToPermissionSet
  CustomerManagedPolicyReference
attachCustomerManagedPolicyReferenceToPermissionSet_customerManagedPolicyReference = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\AttachCustomerManagedPolicyReferenceToPermissionSet' {CustomerManagedPolicyReference
customerManagedPolicyReference :: CustomerManagedPolicyReference
$sel:customerManagedPolicyReference:AttachCustomerManagedPolicyReferenceToPermissionSet' :: AttachCustomerManagedPolicyReferenceToPermissionSet
-> CustomerManagedPolicyReference
customerManagedPolicyReference} -> CustomerManagedPolicyReference
customerManagedPolicyReference) (\s :: AttachCustomerManagedPolicyReferenceToPermissionSet
s@AttachCustomerManagedPolicyReferenceToPermissionSet' {} CustomerManagedPolicyReference
a -> AttachCustomerManagedPolicyReferenceToPermissionSet
s {$sel:customerManagedPolicyReference:AttachCustomerManagedPolicyReferenceToPermissionSet' :: CustomerManagedPolicyReference
customerManagedPolicyReference = CustomerManagedPolicyReference
a} :: AttachCustomerManagedPolicyReferenceToPermissionSet)

instance
  Core.AWSRequest
    AttachCustomerManagedPolicyReferenceToPermissionSet
  where
  type
    AWSResponse
      AttachCustomerManagedPolicyReferenceToPermissionSet =
      AttachCustomerManagedPolicyReferenceToPermissionSetResponse
  request :: (Service -> Service)
-> AttachCustomerManagedPolicyReferenceToPermissionSet
-> Request AttachCustomerManagedPolicyReferenceToPermissionSet
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 AttachCustomerManagedPolicyReferenceToPermissionSet
-> ClientResponse ClientBody
-> m (Either
        Error
        (ClientResponse
           (AWSResponse AttachCustomerManagedPolicyReferenceToPermissionSet)))
response =
    forall (m :: * -> *) a.
MonadResource m =>
(Int -> ResponseHeaders -> () -> Either String (AWSResponse a))
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveEmpty
      ( \Int
s ResponseHeaders
h ()
x ->
          Int -> AttachCustomerManagedPolicyReferenceToPermissionSetResponse
AttachCustomerManagedPolicyReferenceToPermissionSetResponse'
            forall (f :: * -> *) a b. Functor 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
    AttachCustomerManagedPolicyReferenceToPermissionSet
  where
  hashWithSalt :: Int -> AttachCustomerManagedPolicyReferenceToPermissionSet -> Int
hashWithSalt
    Int
_salt
    AttachCustomerManagedPolicyReferenceToPermissionSet' {Text
CustomerManagedPolicyReference
customerManagedPolicyReference :: CustomerManagedPolicyReference
permissionSetArn :: Text
instanceArn :: Text
$sel:customerManagedPolicyReference:AttachCustomerManagedPolicyReferenceToPermissionSet' :: AttachCustomerManagedPolicyReferenceToPermissionSet
-> CustomerManagedPolicyReference
$sel:permissionSetArn:AttachCustomerManagedPolicyReferenceToPermissionSet' :: AttachCustomerManagedPolicyReferenceToPermissionSet -> Text
$sel:instanceArn:AttachCustomerManagedPolicyReferenceToPermissionSet' :: AttachCustomerManagedPolicyReferenceToPermissionSet -> Text
..} =
      Int
_salt
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
instanceArn
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
permissionSetArn
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` CustomerManagedPolicyReference
customerManagedPolicyReference

instance
  Prelude.NFData
    AttachCustomerManagedPolicyReferenceToPermissionSet
  where
  rnf :: AttachCustomerManagedPolicyReferenceToPermissionSet -> ()
rnf
    AttachCustomerManagedPolicyReferenceToPermissionSet' {Text
CustomerManagedPolicyReference
customerManagedPolicyReference :: CustomerManagedPolicyReference
permissionSetArn :: Text
instanceArn :: Text
$sel:customerManagedPolicyReference:AttachCustomerManagedPolicyReferenceToPermissionSet' :: AttachCustomerManagedPolicyReferenceToPermissionSet
-> CustomerManagedPolicyReference
$sel:permissionSetArn:AttachCustomerManagedPolicyReferenceToPermissionSet' :: AttachCustomerManagedPolicyReferenceToPermissionSet -> Text
$sel:instanceArn:AttachCustomerManagedPolicyReferenceToPermissionSet' :: AttachCustomerManagedPolicyReferenceToPermissionSet -> Text
..} =
      forall a. NFData a => a -> ()
Prelude.rnf Text
instanceArn
        seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
permissionSetArn
        seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf CustomerManagedPolicyReference
customerManagedPolicyReference

instance
  Data.ToHeaders
    AttachCustomerManagedPolicyReferenceToPermissionSet
  where
  toHeaders :: AttachCustomerManagedPolicyReferenceToPermissionSet
-> 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
"SWBExternalService.AttachCustomerManagedPolicyReferenceToPermissionSet" ::
                          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
    AttachCustomerManagedPolicyReferenceToPermissionSet
  where
  toJSON :: AttachCustomerManagedPolicyReferenceToPermissionSet -> Value
toJSON
    AttachCustomerManagedPolicyReferenceToPermissionSet' {Text
CustomerManagedPolicyReference
customerManagedPolicyReference :: CustomerManagedPolicyReference
permissionSetArn :: Text
instanceArn :: Text
$sel:customerManagedPolicyReference:AttachCustomerManagedPolicyReferenceToPermissionSet' :: AttachCustomerManagedPolicyReferenceToPermissionSet
-> CustomerManagedPolicyReference
$sel:permissionSetArn:AttachCustomerManagedPolicyReferenceToPermissionSet' :: AttachCustomerManagedPolicyReferenceToPermissionSet -> Text
$sel:instanceArn:AttachCustomerManagedPolicyReferenceToPermissionSet' :: AttachCustomerManagedPolicyReferenceToPermissionSet -> Text
..} =
      [Pair] -> Value
Data.object
        ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
            [ forall a. a -> Maybe a
Prelude.Just (Key
"InstanceArn" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
instanceArn),
              forall a. a -> Maybe a
Prelude.Just
                (Key
"PermissionSetArn" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
permissionSetArn),
              forall a. a -> Maybe a
Prelude.Just
                ( Key
"CustomerManagedPolicyReference"
                    forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= CustomerManagedPolicyReference
customerManagedPolicyReference
                )
            ]
        )

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

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

-- | /See:/ 'newAttachCustomerManagedPolicyReferenceToPermissionSetResponse' smart constructor.
data AttachCustomerManagedPolicyReferenceToPermissionSetResponse = AttachCustomerManagedPolicyReferenceToPermissionSetResponse'
  { -- | The response's http status code.
    AttachCustomerManagedPolicyReferenceToPermissionSetResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> Bool
$c/= :: AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> Bool
== :: AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> Bool
$c== :: AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> Bool
Prelude.Eq, ReadPrec
  [AttachCustomerManagedPolicyReferenceToPermissionSetResponse]
ReadPrec
  AttachCustomerManagedPolicyReferenceToPermissionSetResponse
Int
-> ReadS
     AttachCustomerManagedPolicyReferenceToPermissionSetResponse
ReadS [AttachCustomerManagedPolicyReferenceToPermissionSetResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec
  [AttachCustomerManagedPolicyReferenceToPermissionSetResponse]
$creadListPrec :: ReadPrec
  [AttachCustomerManagedPolicyReferenceToPermissionSetResponse]
readPrec :: ReadPrec
  AttachCustomerManagedPolicyReferenceToPermissionSetResponse
$creadPrec :: ReadPrec
  AttachCustomerManagedPolicyReferenceToPermissionSetResponse
readList :: ReadS [AttachCustomerManagedPolicyReferenceToPermissionSetResponse]
$creadList :: ReadS [AttachCustomerManagedPolicyReferenceToPermissionSetResponse]
readsPrec :: Int
-> ReadS
     AttachCustomerManagedPolicyReferenceToPermissionSetResponse
$creadsPrec :: Int
-> ReadS
     AttachCustomerManagedPolicyReferenceToPermissionSetResponse
Prelude.Read, Int
-> AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> ShowS
[AttachCustomerManagedPolicyReferenceToPermissionSetResponse]
-> ShowS
AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [AttachCustomerManagedPolicyReferenceToPermissionSetResponse]
-> ShowS
$cshowList :: [AttachCustomerManagedPolicyReferenceToPermissionSetResponse]
-> ShowS
show :: AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> String
$cshow :: AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> String
showsPrec :: Int
-> AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> ShowS
$cshowsPrec :: Int
-> AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> ShowS
Prelude.Show, forall x.
Rep AttachCustomerManagedPolicyReferenceToPermissionSetResponse x
-> AttachCustomerManagedPolicyReferenceToPermissionSetResponse
forall x.
AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> Rep
     AttachCustomerManagedPolicyReferenceToPermissionSetResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep AttachCustomerManagedPolicyReferenceToPermissionSetResponse x
-> AttachCustomerManagedPolicyReferenceToPermissionSetResponse
$cfrom :: forall x.
AttachCustomerManagedPolicyReferenceToPermissionSetResponse
-> Rep
     AttachCustomerManagedPolicyReferenceToPermissionSetResponse x
Prelude.Generic)

-- |
-- Create a value of 'AttachCustomerManagedPolicyReferenceToPermissionSetResponse' 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:
--
-- 'httpStatus', 'attachCustomerManagedPolicyReferenceToPermissionSetResponse_httpStatus' - The response's http status code.
newAttachCustomerManagedPolicyReferenceToPermissionSetResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  AttachCustomerManagedPolicyReferenceToPermissionSetResponse
newAttachCustomerManagedPolicyReferenceToPermissionSetResponse :: Int -> AttachCustomerManagedPolicyReferenceToPermissionSetResponse
newAttachCustomerManagedPolicyReferenceToPermissionSetResponse
  Int
pHttpStatus_ =
    AttachCustomerManagedPolicyReferenceToPermissionSetResponse'
      { $sel:httpStatus:AttachCustomerManagedPolicyReferenceToPermissionSetResponse' :: Int
httpStatus =
          Int
pHttpStatus_
      }

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

instance
  Prelude.NFData
    AttachCustomerManagedPolicyReferenceToPermissionSetResponse
  where
  rnf :: AttachCustomerManagedPolicyReferenceToPermissionSetResponse -> ()
rnf
    AttachCustomerManagedPolicyReferenceToPermissionSetResponse' {Int
httpStatus :: Int
$sel:httpStatus:AttachCustomerManagedPolicyReferenceToPermissionSetResponse' :: AttachCustomerManagedPolicyReferenceToPermissionSetResponse -> Int
..} =
      forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus