{-# 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.CertificateManagerPCA.ImportCertificateAuthorityCertificate
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Imports a signed private CA certificate into Amazon Web Services Private
-- CA. This action is used when you are using a chain of trust whose root
-- is located outside Amazon Web Services Private CA. Before you can call
-- this action, the following preparations must in place:
--
-- 1.  In Amazon Web Services Private CA, call the
--     <https://docs.aws.amazon.com/privateca/latest/APIReference/API_CreateCertificateAuthority.html CreateCertificateAuthority>
--     action to create the private CA that you plan to back with the
--     imported certificate.
--
-- 2.  Call the
--     <https://docs.aws.amazon.com/privateca/latest/APIReference/API_GetCertificateAuthorityCsr.html GetCertificateAuthorityCsr>
--     action to generate a certificate signing request (CSR).
--
-- 3.  Sign the CSR using a root or intermediate CA hosted by either an
--     on-premises PKI hierarchy or by a commercial CA.
--
-- 4.  Create a certificate chain and copy the signed certificate and the
--     certificate chain to your working directory.
--
-- Amazon Web Services Private CA supports three scenarios for installing a
-- CA certificate:
--
-- -   Installing a certificate for a root CA hosted by Amazon Web Services
--     Private CA.
--
-- -   Installing a subordinate CA certificate whose parent authority is
--     hosted by Amazon Web Services Private CA.
--
-- -   Installing a subordinate CA certificate whose parent authority is
--     externally hosted.
--
-- The following additional requirements apply when you import a CA
-- certificate.
--
-- -   Only a self-signed certificate can be imported as a root CA.
--
-- -   A self-signed certificate cannot be imported as a subordinate CA.
--
-- -   Your certificate chain must not include the private CA certificate
--     that you are importing.
--
-- -   Your root CA must be the last certificate in your chain. The
--     subordinate certificate, if any, that your root CA signed must be
--     next to last. The subordinate certificate signed by the preceding
--     subordinate CA must come next, and so on until your chain is built.
--
-- -   The chain must be PEM-encoded.
--
-- -   The maximum allowed size of a certificate is 32 KB.
--
-- -   The maximum allowed size of a certificate chain is 2 MB.
--
-- /Enforcement of Critical Constraints/
--
-- Amazon Web Services Private CA allows the following extensions to be
-- marked critical in the imported CA certificate or chain.
--
-- -   Basic constraints (/must/ be marked critical)
--
-- -   Subject alternative names
--
-- -   Key usage
--
-- -   Extended key usage
--
-- -   Authority key identifier
--
-- -   Subject key identifier
--
-- -   Issuer alternative name
--
-- -   Subject directory attributes
--
-- -   Subject information access
--
-- -   Certificate policies
--
-- -   Policy mappings
--
-- -   Inhibit anyPolicy
--
-- Amazon Web Services Private CA rejects the following extensions when
-- they are marked critical in an imported CA certificate or chain.
--
-- -   Name constraints
--
-- -   Policy constraints
--
-- -   CRL distribution points
--
-- -   Authority information access
--
-- -   Freshest CRL
--
-- -   Any other extension
module Amazonka.CertificateManagerPCA.ImportCertificateAuthorityCertificate
  ( -- * Creating a Request
    ImportCertificateAuthorityCertificate (..),
    newImportCertificateAuthorityCertificate,

    -- * Request Lenses
    importCertificateAuthorityCertificate_certificateChain,
    importCertificateAuthorityCertificate_certificateAuthorityArn,
    importCertificateAuthorityCertificate_certificate,

    -- * Destructuring the Response
    ImportCertificateAuthorityCertificateResponse (..),
    newImportCertificateAuthorityCertificateResponse,
  )
where

import Amazonka.CertificateManagerPCA.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:/ 'newImportCertificateAuthorityCertificate' smart constructor.
data ImportCertificateAuthorityCertificate = ImportCertificateAuthorityCertificate'
  { -- | A PEM-encoded file that contains all of your certificates, other than
    -- the certificate you\'re importing, chaining up to your root CA. Your
    -- Amazon Web Services Private CA-hosted or on-premises root certificate is
    -- the last in the chain, and each certificate in the chain signs the one
    -- preceding.
    --
    -- This parameter must be supplied when you import a subordinate CA. When
    -- you import a root CA, there is no chain.
    ImportCertificateAuthorityCertificate -> Maybe Base64
certificateChain :: Prelude.Maybe Data.Base64,
    -- | The Amazon Resource Name (ARN) that was returned when you called
    -- <https://docs.aws.amazon.com/privateca/latest/APIReference/API_CreateCertificateAuthority.html CreateCertificateAuthority>.
    -- This must be of the form:
    --
    -- @arn:aws:acm-pca:@/@region@/@:@/@account@/@:certificate-authority\/@/@12345678-1234-1234-1234-123456789012@/@ @
    ImportCertificateAuthorityCertificate -> Text
certificateAuthorityArn :: Prelude.Text,
    -- | The PEM-encoded certificate for a private CA. This may be a self-signed
    -- certificate in the case of a root CA, or it may be signed by another CA
    -- that you control.
    ImportCertificateAuthorityCertificate -> Base64
certificate :: Data.Base64
  }
  deriving (ImportCertificateAuthorityCertificate
-> ImportCertificateAuthorityCertificate -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ImportCertificateAuthorityCertificate
-> ImportCertificateAuthorityCertificate -> Bool
$c/= :: ImportCertificateAuthorityCertificate
-> ImportCertificateAuthorityCertificate -> Bool
== :: ImportCertificateAuthorityCertificate
-> ImportCertificateAuthorityCertificate -> Bool
$c== :: ImportCertificateAuthorityCertificate
-> ImportCertificateAuthorityCertificate -> Bool
Prelude.Eq, ReadPrec [ImportCertificateAuthorityCertificate]
ReadPrec ImportCertificateAuthorityCertificate
Int -> ReadS ImportCertificateAuthorityCertificate
ReadS [ImportCertificateAuthorityCertificate]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ImportCertificateAuthorityCertificate]
$creadListPrec :: ReadPrec [ImportCertificateAuthorityCertificate]
readPrec :: ReadPrec ImportCertificateAuthorityCertificate
$creadPrec :: ReadPrec ImportCertificateAuthorityCertificate
readList :: ReadS [ImportCertificateAuthorityCertificate]
$creadList :: ReadS [ImportCertificateAuthorityCertificate]
readsPrec :: Int -> ReadS ImportCertificateAuthorityCertificate
$creadsPrec :: Int -> ReadS ImportCertificateAuthorityCertificate
Prelude.Read, Int -> ImportCertificateAuthorityCertificate -> ShowS
[ImportCertificateAuthorityCertificate] -> ShowS
ImportCertificateAuthorityCertificate -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ImportCertificateAuthorityCertificate] -> ShowS
$cshowList :: [ImportCertificateAuthorityCertificate] -> ShowS
show :: ImportCertificateAuthorityCertificate -> String
$cshow :: ImportCertificateAuthorityCertificate -> String
showsPrec :: Int -> ImportCertificateAuthorityCertificate -> ShowS
$cshowsPrec :: Int -> ImportCertificateAuthorityCertificate -> ShowS
Prelude.Show, forall x.
Rep ImportCertificateAuthorityCertificate x
-> ImportCertificateAuthorityCertificate
forall x.
ImportCertificateAuthorityCertificate
-> Rep ImportCertificateAuthorityCertificate x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep ImportCertificateAuthorityCertificate x
-> ImportCertificateAuthorityCertificate
$cfrom :: forall x.
ImportCertificateAuthorityCertificate
-> Rep ImportCertificateAuthorityCertificate x
Prelude.Generic)

-- |
-- Create a value of 'ImportCertificateAuthorityCertificate' 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:
--
-- 'certificateChain', 'importCertificateAuthorityCertificate_certificateChain' - A PEM-encoded file that contains all of your certificates, other than
-- the certificate you\'re importing, chaining up to your root CA. Your
-- Amazon Web Services Private CA-hosted or on-premises root certificate is
-- the last in the chain, and each certificate in the chain signs the one
-- preceding.
--
-- This parameter must be supplied when you import a subordinate CA. When
-- you import a root CA, there is no chain.--
-- -- /Note:/ This 'Lens' automatically encodes and decodes Base64 data.
-- -- The underlying isomorphism will encode to Base64 representation during
-- -- serialisation, and decode from Base64 representation during deserialisation.
-- -- This 'Lens' accepts and returns only raw unencoded data.
--
-- 'certificateAuthorityArn', 'importCertificateAuthorityCertificate_certificateAuthorityArn' - The Amazon Resource Name (ARN) that was returned when you called
-- <https://docs.aws.amazon.com/privateca/latest/APIReference/API_CreateCertificateAuthority.html CreateCertificateAuthority>.
-- This must be of the form:
--
-- @arn:aws:acm-pca:@/@region@/@:@/@account@/@:certificate-authority\/@/@12345678-1234-1234-1234-123456789012@/@ @
--
-- 'certificate', 'importCertificateAuthorityCertificate_certificate' - The PEM-encoded certificate for a private CA. This may be a self-signed
-- certificate in the case of a root CA, or it may be signed by another CA
-- that you control.--
-- -- /Note:/ This 'Lens' automatically encodes and decodes Base64 data.
-- -- The underlying isomorphism will encode to Base64 representation during
-- -- serialisation, and decode from Base64 representation during deserialisation.
-- -- This 'Lens' accepts and returns only raw unencoded data.
newImportCertificateAuthorityCertificate ::
  -- | 'certificateAuthorityArn'
  Prelude.Text ->
  -- | 'certificate'
  Prelude.ByteString ->
  ImportCertificateAuthorityCertificate
newImportCertificateAuthorityCertificate :: Text -> ByteString -> ImportCertificateAuthorityCertificate
newImportCertificateAuthorityCertificate
  Text
pCertificateAuthorityArn_
  ByteString
pCertificate_ =
    ImportCertificateAuthorityCertificate'
      { $sel:certificateChain:ImportCertificateAuthorityCertificate' :: Maybe Base64
certificateChain =
          forall a. Maybe a
Prelude.Nothing,
        $sel:certificateAuthorityArn:ImportCertificateAuthorityCertificate' :: Text
certificateAuthorityArn =
          Text
pCertificateAuthorityArn_,
        $sel:certificate:ImportCertificateAuthorityCertificate' :: Base64
certificate =
          Iso' Base64 ByteString
Data._Base64 forall t b. AReview t b -> b -> t
Lens.# ByteString
pCertificate_
      }

-- | A PEM-encoded file that contains all of your certificates, other than
-- the certificate you\'re importing, chaining up to your root CA. Your
-- Amazon Web Services Private CA-hosted or on-premises root certificate is
-- the last in the chain, and each certificate in the chain signs the one
-- preceding.
--
-- This parameter must be supplied when you import a subordinate CA. When
-- you import a root CA, there is no chain.--
-- -- /Note:/ This 'Lens' automatically encodes and decodes Base64 data.
-- -- The underlying isomorphism will encode to Base64 representation during
-- -- serialisation, and decode from Base64 representation during deserialisation.
-- -- This 'Lens' accepts and returns only raw unencoded data.
importCertificateAuthorityCertificate_certificateChain :: Lens.Lens' ImportCertificateAuthorityCertificate (Prelude.Maybe Prelude.ByteString)
importCertificateAuthorityCertificate_certificateChain :: Lens' ImportCertificateAuthorityCertificate (Maybe ByteString)
importCertificateAuthorityCertificate_certificateChain = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ImportCertificateAuthorityCertificate' {Maybe Base64
certificateChain :: Maybe Base64
$sel:certificateChain:ImportCertificateAuthorityCertificate' :: ImportCertificateAuthorityCertificate -> Maybe Base64
certificateChain} -> Maybe Base64
certificateChain) (\s :: ImportCertificateAuthorityCertificate
s@ImportCertificateAuthorityCertificate' {} Maybe Base64
a -> ImportCertificateAuthorityCertificate
s {$sel:certificateChain:ImportCertificateAuthorityCertificate' :: Maybe Base64
certificateChain = Maybe Base64
a} :: ImportCertificateAuthorityCertificate) 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 Iso' Base64 ByteString
Data._Base64

-- | The Amazon Resource Name (ARN) that was returned when you called
-- <https://docs.aws.amazon.com/privateca/latest/APIReference/API_CreateCertificateAuthority.html CreateCertificateAuthority>.
-- This must be of the form:
--
-- @arn:aws:acm-pca:@/@region@/@:@/@account@/@:certificate-authority\/@/@12345678-1234-1234-1234-123456789012@/@ @
importCertificateAuthorityCertificate_certificateAuthorityArn :: Lens.Lens' ImportCertificateAuthorityCertificate Prelude.Text
importCertificateAuthorityCertificate_certificateAuthorityArn :: Lens' ImportCertificateAuthorityCertificate Text
importCertificateAuthorityCertificate_certificateAuthorityArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ImportCertificateAuthorityCertificate' {Text
certificateAuthorityArn :: Text
$sel:certificateAuthorityArn:ImportCertificateAuthorityCertificate' :: ImportCertificateAuthorityCertificate -> Text
certificateAuthorityArn} -> Text
certificateAuthorityArn) (\s :: ImportCertificateAuthorityCertificate
s@ImportCertificateAuthorityCertificate' {} Text
a -> ImportCertificateAuthorityCertificate
s {$sel:certificateAuthorityArn:ImportCertificateAuthorityCertificate' :: Text
certificateAuthorityArn = Text
a} :: ImportCertificateAuthorityCertificate)

-- | The PEM-encoded certificate for a private CA. This may be a self-signed
-- certificate in the case of a root CA, or it may be signed by another CA
-- that you control.--
-- -- /Note:/ This 'Lens' automatically encodes and decodes Base64 data.
-- -- The underlying isomorphism will encode to Base64 representation during
-- -- serialisation, and decode from Base64 representation during deserialisation.
-- -- This 'Lens' accepts and returns only raw unencoded data.
importCertificateAuthorityCertificate_certificate :: Lens.Lens' ImportCertificateAuthorityCertificate Prelude.ByteString
importCertificateAuthorityCertificate_certificate :: Lens' ImportCertificateAuthorityCertificate ByteString
importCertificateAuthorityCertificate_certificate = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ImportCertificateAuthorityCertificate' {Base64
certificate :: Base64
$sel:certificate:ImportCertificateAuthorityCertificate' :: ImportCertificateAuthorityCertificate -> Base64
certificate} -> Base64
certificate) (\s :: ImportCertificateAuthorityCertificate
s@ImportCertificateAuthorityCertificate' {} Base64
a -> ImportCertificateAuthorityCertificate
s {$sel:certificate:ImportCertificateAuthorityCertificate' :: Base64
certificate = Base64
a} :: ImportCertificateAuthorityCertificate) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. Iso' Base64 ByteString
Data._Base64

instance
  Core.AWSRequest
    ImportCertificateAuthorityCertificate
  where
  type
    AWSResponse
      ImportCertificateAuthorityCertificate =
      ImportCertificateAuthorityCertificateResponse
  request :: (Service -> Service)
-> ImportCertificateAuthorityCertificate
-> Request ImportCertificateAuthorityCertificate
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 ImportCertificateAuthorityCertificate
-> ClientResponse ClientBody
-> m (Either
        Error
        (ClientResponse
           (AWSResponse ImportCertificateAuthorityCertificate)))
response =
    forall (m :: * -> *) a.
MonadResource m =>
AWSResponse a
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveNull
      ImportCertificateAuthorityCertificateResponse
ImportCertificateAuthorityCertificateResponse'

instance
  Prelude.Hashable
    ImportCertificateAuthorityCertificate
  where
  hashWithSalt :: Int -> ImportCertificateAuthorityCertificate -> Int
hashWithSalt
    Int
_salt
    ImportCertificateAuthorityCertificate' {Maybe Base64
Text
Base64
certificate :: Base64
certificateAuthorityArn :: Text
certificateChain :: Maybe Base64
$sel:certificate:ImportCertificateAuthorityCertificate' :: ImportCertificateAuthorityCertificate -> Base64
$sel:certificateAuthorityArn:ImportCertificateAuthorityCertificate' :: ImportCertificateAuthorityCertificate -> Text
$sel:certificateChain:ImportCertificateAuthorityCertificate' :: ImportCertificateAuthorityCertificate -> Maybe Base64
..} =
      Int
_salt
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Base64
certificateChain
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
certificateAuthorityArn
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Base64
certificate

instance
  Prelude.NFData
    ImportCertificateAuthorityCertificate
  where
  rnf :: ImportCertificateAuthorityCertificate -> ()
rnf ImportCertificateAuthorityCertificate' {Maybe Base64
Text
Base64
certificate :: Base64
certificateAuthorityArn :: Text
certificateChain :: Maybe Base64
$sel:certificate:ImportCertificateAuthorityCertificate' :: ImportCertificateAuthorityCertificate -> Base64
$sel:certificateAuthorityArn:ImportCertificateAuthorityCertificate' :: ImportCertificateAuthorityCertificate -> Text
$sel:certificateChain:ImportCertificateAuthorityCertificate' :: ImportCertificateAuthorityCertificate -> Maybe Base64
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Base64
certificateChain
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
certificateAuthorityArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Base64
certificate

instance
  Data.ToHeaders
    ImportCertificateAuthorityCertificate
  where
  toHeaders :: ImportCertificateAuthorityCertificate -> [Header]
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 -> [Header]
Data.=# ( ByteString
"ACMPrivateCA.ImportCertificateAuthorityCertificate" ::
                          Prelude.ByteString
                      ),
            HeaderName
"Content-Type"
              forall a. ToHeader a => HeaderName -> a -> [Header]
Data.=# ( ByteString
"application/x-amz-json-1.1" ::
                          Prelude.ByteString
                      )
          ]
      )

instance
  Data.ToJSON
    ImportCertificateAuthorityCertificate
  where
  toJSON :: ImportCertificateAuthorityCertificate -> Value
toJSON ImportCertificateAuthorityCertificate' {Maybe Base64
Text
Base64
certificate :: Base64
certificateAuthorityArn :: Text
certificateChain :: Maybe Base64
$sel:certificate:ImportCertificateAuthorityCertificate' :: ImportCertificateAuthorityCertificate -> Base64
$sel:certificateAuthorityArn:ImportCertificateAuthorityCertificate' :: ImportCertificateAuthorityCertificate -> Text
$sel:certificateChain:ImportCertificateAuthorityCertificate' :: ImportCertificateAuthorityCertificate -> Maybe Base64
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"CertificateChain" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Base64
certificateChain,
            forall a. a -> Maybe a
Prelude.Just
              ( Key
"CertificateAuthorityArn"
                  forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
certificateAuthorityArn
              ),
            forall a. a -> Maybe a
Prelude.Just (Key
"Certificate" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Base64
certificate)
          ]
      )

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

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

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

-- |
-- Create a value of 'ImportCertificateAuthorityCertificateResponse' 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.
newImportCertificateAuthorityCertificateResponse ::
  ImportCertificateAuthorityCertificateResponse
newImportCertificateAuthorityCertificateResponse :: ImportCertificateAuthorityCertificateResponse
newImportCertificateAuthorityCertificateResponse =
  ImportCertificateAuthorityCertificateResponse
ImportCertificateAuthorityCertificateResponse'

instance
  Prelude.NFData
    ImportCertificateAuthorityCertificateResponse
  where
  rnf :: ImportCertificateAuthorityCertificateResponse -> ()
rnf ImportCertificateAuthorityCertificateResponse
_ = ()