module Stratosphere.ACMPCA.CertificateAuthority (
        module Exports, CertificateAuthority(..), mkCertificateAuthority
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.ACMPCA.CertificateAuthority.CsrExtensionsProperty as Exports
import {-# SOURCE #-} Stratosphere.ACMPCA.CertificateAuthority.RevocationConfigurationProperty as Exports
import {-# SOURCE #-} Stratosphere.ACMPCA.CertificateAuthority.SubjectProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Tag
import Stratosphere.Value
data CertificateAuthority
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-acmpca-certificateauthority.html>
    CertificateAuthority {CertificateAuthority -> ()
haddock_workaround_ :: (),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-acmpca-certificateauthority.html#cfn-acmpca-certificateauthority-csrextensions>
                          CertificateAuthority -> Maybe CsrExtensionsProperty
csrExtensions :: (Prelude.Maybe CsrExtensionsProperty),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-acmpca-certificateauthority.html#cfn-acmpca-certificateauthority-keyalgorithm>
                          CertificateAuthority -> Value Text
keyAlgorithm :: (Value Prelude.Text),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-acmpca-certificateauthority.html#cfn-acmpca-certificateauthority-keystoragesecuritystandard>
                          CertificateAuthority -> Maybe (Value Text)
keyStorageSecurityStandard :: (Prelude.Maybe (Value Prelude.Text)),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-acmpca-certificateauthority.html#cfn-acmpca-certificateauthority-revocationconfiguration>
                          CertificateAuthority -> Maybe RevocationConfigurationProperty
revocationConfiguration :: (Prelude.Maybe RevocationConfigurationProperty),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-acmpca-certificateauthority.html#cfn-acmpca-certificateauthority-signingalgorithm>
                          CertificateAuthority -> Value Text
signingAlgorithm :: (Value Prelude.Text),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-acmpca-certificateauthority.html#cfn-acmpca-certificateauthority-subject>
                          CertificateAuthority -> SubjectProperty
subject :: SubjectProperty,
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-acmpca-certificateauthority.html#cfn-acmpca-certificateauthority-tags>
                          CertificateAuthority -> Maybe [Tag]
tags :: (Prelude.Maybe [Tag]),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-acmpca-certificateauthority.html#cfn-acmpca-certificateauthority-type>
                          CertificateAuthority -> Value Text
type' :: (Value Prelude.Text),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-acmpca-certificateauthority.html#cfn-acmpca-certificateauthority-usagemode>
                          CertificateAuthority -> Maybe (Value Text)
usageMode :: (Prelude.Maybe (Value Prelude.Text))}
  deriving stock (CertificateAuthority -> CertificateAuthority -> Bool
(CertificateAuthority -> CertificateAuthority -> Bool)
-> (CertificateAuthority -> CertificateAuthority -> Bool)
-> Eq CertificateAuthority
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: CertificateAuthority -> CertificateAuthority -> Bool
== :: CertificateAuthority -> CertificateAuthority -> Bool
$c/= :: CertificateAuthority -> CertificateAuthority -> Bool
/= :: CertificateAuthority -> CertificateAuthority -> Bool
Prelude.Eq, Int -> CertificateAuthority -> ShowS
[CertificateAuthority] -> ShowS
CertificateAuthority -> String
(Int -> CertificateAuthority -> ShowS)
-> (CertificateAuthority -> String)
-> ([CertificateAuthority] -> ShowS)
-> Show CertificateAuthority
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> CertificateAuthority -> ShowS
showsPrec :: Int -> CertificateAuthority -> ShowS
$cshow :: CertificateAuthority -> String
show :: CertificateAuthority -> String
$cshowList :: [CertificateAuthority] -> ShowS
showList :: [CertificateAuthority] -> ShowS
Prelude.Show)
mkCertificateAuthority ::
  Value Prelude.Text
  -> Value Prelude.Text
     -> SubjectProperty -> Value Prelude.Text -> CertificateAuthority
mkCertificateAuthority :: Value Text
-> Value Text
-> SubjectProperty
-> Value Text
-> CertificateAuthority
mkCertificateAuthority Value Text
keyAlgorithm Value Text
signingAlgorithm SubjectProperty
subject Value Text
type'
  = CertificateAuthority
      {haddock_workaround_ :: ()
haddock_workaround_ = (), keyAlgorithm :: Value Text
keyAlgorithm = Value Text
keyAlgorithm,
       signingAlgorithm :: Value Text
signingAlgorithm = Value Text
signingAlgorithm, subject :: SubjectProperty
subject = SubjectProperty
subject,
       type' :: Value Text
type' = Value Text
type', csrExtensions :: Maybe CsrExtensionsProperty
csrExtensions = Maybe CsrExtensionsProperty
forall a. Maybe a
Prelude.Nothing,
       keyStorageSecurityStandard :: Maybe (Value Text)
keyStorageSecurityStandard = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       revocationConfiguration :: Maybe RevocationConfigurationProperty
revocationConfiguration = Maybe RevocationConfigurationProperty
forall a. Maybe a
Prelude.Nothing, tags :: Maybe [Tag]
tags = Maybe [Tag]
forall a. Maybe a
Prelude.Nothing,
       usageMode :: Maybe (Value Text)
usageMode = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties CertificateAuthority where
  toResourceProperties :: CertificateAuthority -> ResourceProperties
toResourceProperties CertificateAuthority {Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: CertificateAuthority -> ()
csrExtensions :: CertificateAuthority -> Maybe CsrExtensionsProperty
keyAlgorithm :: CertificateAuthority -> Value Text
keyStorageSecurityStandard :: CertificateAuthority -> Maybe (Value Text)
revocationConfiguration :: CertificateAuthority -> Maybe RevocationConfigurationProperty
signingAlgorithm :: CertificateAuthority -> Value Text
subject :: CertificateAuthority -> SubjectProperty
tags :: CertificateAuthority -> Maybe [Tag]
type' :: CertificateAuthority -> Value Text
usageMode :: CertificateAuthority -> Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::ACMPCA::CertificateAuthority",
         supportsTags :: Bool
supportsTags = Bool
Prelude.True,
         properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
                        ([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
                           [Key
"KeyAlgorithm" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
keyAlgorithm,
                            Key
"SigningAlgorithm" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
signingAlgorithm,
                            Key
"Subject" Key -> SubjectProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= SubjectProperty
subject, Key
"Type" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
type']
                           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                              [Key -> CsrExtensionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CsrExtensions" (CsrExtensionsProperty -> (Key, Value))
-> Maybe CsrExtensionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CsrExtensionsProperty
csrExtensions,
                               Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"KeyStorageSecurityStandard"
                                 (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
keyStorageSecurityStandard,
                               Key -> RevocationConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RevocationConfiguration"
                                 (RevocationConfigurationProperty -> (Key, Value))
-> Maybe RevocationConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe RevocationConfigurationProperty
revocationConfiguration,
                               Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags,
                               Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"UsageMode" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
usageMode]))}
instance JSON.ToJSON CertificateAuthority where
  toJSON :: CertificateAuthority -> Value
toJSON CertificateAuthority {Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: CertificateAuthority -> ()
csrExtensions :: CertificateAuthority -> Maybe CsrExtensionsProperty
keyAlgorithm :: CertificateAuthority -> Value Text
keyStorageSecurityStandard :: CertificateAuthority -> Maybe (Value Text)
revocationConfiguration :: CertificateAuthority -> Maybe RevocationConfigurationProperty
signingAlgorithm :: CertificateAuthority -> Value Text
subject :: CertificateAuthority -> SubjectProperty
tags :: CertificateAuthority -> Maybe [Tag]
type' :: CertificateAuthority -> Value Text
usageMode :: CertificateAuthority -> Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
    = [(Key, Value)] -> Value
JSON.object
        ([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
           ([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
              [Key
"KeyAlgorithm" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
keyAlgorithm,
               Key
"SigningAlgorithm" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
signingAlgorithm,
               Key
"Subject" Key -> SubjectProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= SubjectProperty
subject, Key
"Type" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
type']
              ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                 [Key -> CsrExtensionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CsrExtensions" (CsrExtensionsProperty -> (Key, Value))
-> Maybe CsrExtensionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CsrExtensionsProperty
csrExtensions,
                  Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"KeyStorageSecurityStandard"
                    (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
keyStorageSecurityStandard,
                  Key -> RevocationConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RevocationConfiguration"
                    (RevocationConfigurationProperty -> (Key, Value))
-> Maybe RevocationConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe RevocationConfigurationProperty
revocationConfiguration,
                  Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags,
                  Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"UsageMode" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
usageMode])))
instance Property "CsrExtensions" CertificateAuthority where
  type PropertyType "CsrExtensions" CertificateAuthority = CsrExtensionsProperty
  set :: PropertyType "CsrExtensions" CertificateAuthority
-> CertificateAuthority -> CertificateAuthority
set PropertyType "CsrExtensions" CertificateAuthority
newValue CertificateAuthority {Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: CertificateAuthority -> ()
csrExtensions :: CertificateAuthority -> Maybe CsrExtensionsProperty
keyAlgorithm :: CertificateAuthority -> Value Text
keyStorageSecurityStandard :: CertificateAuthority -> Maybe (Value Text)
revocationConfiguration :: CertificateAuthority -> Maybe RevocationConfigurationProperty
signingAlgorithm :: CertificateAuthority -> Value Text
subject :: CertificateAuthority -> SubjectProperty
tags :: CertificateAuthority -> Maybe [Tag]
type' :: CertificateAuthority -> Value Text
usageMode :: CertificateAuthority -> Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
    = CertificateAuthority {csrExtensions :: Maybe CsrExtensionsProperty
csrExtensions = CsrExtensionsProperty -> Maybe CsrExtensionsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CsrExtensions" CertificateAuthority
CsrExtensionsProperty
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: ()
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
haddock_workaround_ :: ()
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
instance Property "KeyAlgorithm" CertificateAuthority where
  type PropertyType "KeyAlgorithm" CertificateAuthority = Value Prelude.Text
  set :: PropertyType "KeyAlgorithm" CertificateAuthority
-> CertificateAuthority -> CertificateAuthority
set PropertyType "KeyAlgorithm" CertificateAuthority
newValue CertificateAuthority {Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: CertificateAuthority -> ()
csrExtensions :: CertificateAuthority -> Maybe CsrExtensionsProperty
keyAlgorithm :: CertificateAuthority -> Value Text
keyStorageSecurityStandard :: CertificateAuthority -> Maybe (Value Text)
revocationConfiguration :: CertificateAuthority -> Maybe RevocationConfigurationProperty
signingAlgorithm :: CertificateAuthority -> Value Text
subject :: CertificateAuthority -> SubjectProperty
tags :: CertificateAuthority -> Maybe [Tag]
type' :: CertificateAuthority -> Value Text
usageMode :: CertificateAuthority -> Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
    = CertificateAuthority {keyAlgorithm :: Value Text
keyAlgorithm = PropertyType "KeyAlgorithm" CertificateAuthority
Value Text
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
instance Property "KeyStorageSecurityStandard" CertificateAuthority where
  type PropertyType "KeyStorageSecurityStandard" CertificateAuthority = Value Prelude.Text
  set :: PropertyType "KeyStorageSecurityStandard" CertificateAuthority
-> CertificateAuthority -> CertificateAuthority
set PropertyType "KeyStorageSecurityStandard" CertificateAuthority
newValue CertificateAuthority {Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: CertificateAuthority -> ()
csrExtensions :: CertificateAuthority -> Maybe CsrExtensionsProperty
keyAlgorithm :: CertificateAuthority -> Value Text
keyStorageSecurityStandard :: CertificateAuthority -> Maybe (Value Text)
revocationConfiguration :: CertificateAuthority -> Maybe RevocationConfigurationProperty
signingAlgorithm :: CertificateAuthority -> Value Text
subject :: CertificateAuthority -> SubjectProperty
tags :: CertificateAuthority -> Maybe [Tag]
type' :: CertificateAuthority -> Value Text
usageMode :: CertificateAuthority -> Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
    = CertificateAuthority
        {keyStorageSecurityStandard :: Maybe (Value Text)
keyStorageSecurityStandard = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "KeyStorageSecurityStandard" CertificateAuthority
Value Text
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
instance Property "RevocationConfiguration" CertificateAuthority where
  type PropertyType "RevocationConfiguration" CertificateAuthority = RevocationConfigurationProperty
  set :: PropertyType "RevocationConfiguration" CertificateAuthority
-> CertificateAuthority -> CertificateAuthority
set PropertyType "RevocationConfiguration" CertificateAuthority
newValue CertificateAuthority {Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: CertificateAuthority -> ()
csrExtensions :: CertificateAuthority -> Maybe CsrExtensionsProperty
keyAlgorithm :: CertificateAuthority -> Value Text
keyStorageSecurityStandard :: CertificateAuthority -> Maybe (Value Text)
revocationConfiguration :: CertificateAuthority -> Maybe RevocationConfigurationProperty
signingAlgorithm :: CertificateAuthority -> Value Text
subject :: CertificateAuthority -> SubjectProperty
tags :: CertificateAuthority -> Maybe [Tag]
type' :: CertificateAuthority -> Value Text
usageMode :: CertificateAuthority -> Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
    = CertificateAuthority
        {revocationConfiguration :: Maybe RevocationConfigurationProperty
revocationConfiguration = RevocationConfigurationProperty
-> Maybe RevocationConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "RevocationConfiguration" CertificateAuthority
RevocationConfigurationProperty
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
instance Property "SigningAlgorithm" CertificateAuthority where
  type PropertyType "SigningAlgorithm" CertificateAuthority = Value Prelude.Text
  set :: PropertyType "SigningAlgorithm" CertificateAuthority
-> CertificateAuthority -> CertificateAuthority
set PropertyType "SigningAlgorithm" CertificateAuthority
newValue CertificateAuthority {Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: CertificateAuthority -> ()
csrExtensions :: CertificateAuthority -> Maybe CsrExtensionsProperty
keyAlgorithm :: CertificateAuthority -> Value Text
keyStorageSecurityStandard :: CertificateAuthority -> Maybe (Value Text)
revocationConfiguration :: CertificateAuthority -> Maybe RevocationConfigurationProperty
signingAlgorithm :: CertificateAuthority -> Value Text
subject :: CertificateAuthority -> SubjectProperty
tags :: CertificateAuthority -> Maybe [Tag]
type' :: CertificateAuthority -> Value Text
usageMode :: CertificateAuthority -> Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
    = CertificateAuthority {signingAlgorithm :: Value Text
signingAlgorithm = PropertyType "SigningAlgorithm" CertificateAuthority
Value Text
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
instance Property "Subject" CertificateAuthority where
  type PropertyType "Subject" CertificateAuthority = SubjectProperty
  set :: PropertyType "Subject" CertificateAuthority
-> CertificateAuthority -> CertificateAuthority
set PropertyType "Subject" CertificateAuthority
newValue CertificateAuthority {Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: CertificateAuthority -> ()
csrExtensions :: CertificateAuthority -> Maybe CsrExtensionsProperty
keyAlgorithm :: CertificateAuthority -> Value Text
keyStorageSecurityStandard :: CertificateAuthority -> Maybe (Value Text)
revocationConfiguration :: CertificateAuthority -> Maybe RevocationConfigurationProperty
signingAlgorithm :: CertificateAuthority -> Value Text
subject :: CertificateAuthority -> SubjectProperty
tags :: CertificateAuthority -> Maybe [Tag]
type' :: CertificateAuthority -> Value Text
usageMode :: CertificateAuthority -> Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
    = CertificateAuthority {subject :: SubjectProperty
subject = PropertyType "Subject" CertificateAuthority
SubjectProperty
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
instance Property "Tags" CertificateAuthority where
  type PropertyType "Tags" CertificateAuthority = [Tag]
  set :: PropertyType "Tags" CertificateAuthority
-> CertificateAuthority -> CertificateAuthority
set PropertyType "Tags" CertificateAuthority
newValue CertificateAuthority {Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: CertificateAuthority -> ()
csrExtensions :: CertificateAuthority -> Maybe CsrExtensionsProperty
keyAlgorithm :: CertificateAuthority -> Value Text
keyStorageSecurityStandard :: CertificateAuthority -> Maybe (Value Text)
revocationConfiguration :: CertificateAuthority -> Maybe RevocationConfigurationProperty
signingAlgorithm :: CertificateAuthority -> Value Text
subject :: CertificateAuthority -> SubjectProperty
tags :: CertificateAuthority -> Maybe [Tag]
type' :: CertificateAuthority -> Value Text
usageMode :: CertificateAuthority -> Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
    = CertificateAuthority {tags :: Maybe [Tag]
tags = [Tag] -> Maybe [Tag]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [Tag]
PropertyType "Tags" CertificateAuthority
newValue, Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
type' :: Value Text
usageMode :: Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
instance Property "Type" CertificateAuthority where
  type PropertyType "Type" CertificateAuthority = Value Prelude.Text
  set :: PropertyType "Type" CertificateAuthority
-> CertificateAuthority -> CertificateAuthority
set PropertyType "Type" CertificateAuthority
newValue CertificateAuthority {Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: CertificateAuthority -> ()
csrExtensions :: CertificateAuthority -> Maybe CsrExtensionsProperty
keyAlgorithm :: CertificateAuthority -> Value Text
keyStorageSecurityStandard :: CertificateAuthority -> Maybe (Value Text)
revocationConfiguration :: CertificateAuthority -> Maybe RevocationConfigurationProperty
signingAlgorithm :: CertificateAuthority -> Value Text
subject :: CertificateAuthority -> SubjectProperty
tags :: CertificateAuthority -> Maybe [Tag]
type' :: CertificateAuthority -> Value Text
usageMode :: CertificateAuthority -> Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
    = CertificateAuthority {type' :: Value Text
type' = PropertyType "Type" CertificateAuthority
Value Text
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
usageMode :: Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
usageMode :: Maybe (Value Text)
..}
instance Property "UsageMode" CertificateAuthority where
  type PropertyType "UsageMode" CertificateAuthority = Value Prelude.Text
  set :: PropertyType "UsageMode" CertificateAuthority
-> CertificateAuthority -> CertificateAuthority
set PropertyType "UsageMode" CertificateAuthority
newValue CertificateAuthority {Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: CertificateAuthority -> ()
csrExtensions :: CertificateAuthority -> Maybe CsrExtensionsProperty
keyAlgorithm :: CertificateAuthority -> Value Text
keyStorageSecurityStandard :: CertificateAuthority -> Maybe (Value Text)
revocationConfiguration :: CertificateAuthority -> Maybe RevocationConfigurationProperty
signingAlgorithm :: CertificateAuthority -> Value Text
subject :: CertificateAuthority -> SubjectProperty
tags :: CertificateAuthority -> Maybe [Tag]
type' :: CertificateAuthority -> Value Text
usageMode :: CertificateAuthority -> Maybe (Value Text)
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
usageMode :: Maybe (Value Text)
..}
    = CertificateAuthority {usageMode :: Maybe (Value Text)
usageMode = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "UsageMode" CertificateAuthority
Value Text
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe RevocationConfigurationProperty
Maybe CsrExtensionsProperty
()
Value Text
SubjectProperty
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
haddock_workaround_ :: ()
csrExtensions :: Maybe CsrExtensionsProperty
keyAlgorithm :: Value Text
keyStorageSecurityStandard :: Maybe (Value Text)
revocationConfiguration :: Maybe RevocationConfigurationProperty
signingAlgorithm :: Value Text
subject :: SubjectProperty
tags :: Maybe [Tag]
type' :: Value Text
..}