module Stratosphere.SecurityHub.ProductSubscription (
ProductSubscription(..), mkProductSubscription
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data ProductSubscription
=
ProductSubscription {ProductSubscription -> ()
haddock_workaround_ :: (),
ProductSubscription -> Value Text
productArn :: (Value Prelude.Text)}
deriving stock (ProductSubscription -> ProductSubscription -> Bool
(ProductSubscription -> ProductSubscription -> Bool)
-> (ProductSubscription -> ProductSubscription -> Bool)
-> Eq ProductSubscription
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ProductSubscription -> ProductSubscription -> Bool
== :: ProductSubscription -> ProductSubscription -> Bool
$c/= :: ProductSubscription -> ProductSubscription -> Bool
/= :: ProductSubscription -> ProductSubscription -> Bool
Prelude.Eq, Int -> ProductSubscription -> ShowS
[ProductSubscription] -> ShowS
ProductSubscription -> String
(Int -> ProductSubscription -> ShowS)
-> (ProductSubscription -> String)
-> ([ProductSubscription] -> ShowS)
-> Show ProductSubscription
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ProductSubscription -> ShowS
showsPrec :: Int -> ProductSubscription -> ShowS
$cshow :: ProductSubscription -> String
show :: ProductSubscription -> String
$cshowList :: [ProductSubscription] -> ShowS
showList :: [ProductSubscription] -> ShowS
Prelude.Show)
mkProductSubscription :: Value Prelude.Text -> ProductSubscription
mkProductSubscription :: Value Text -> ProductSubscription
mkProductSubscription Value Text
productArn
= ProductSubscription
{haddock_workaround_ :: ()
haddock_workaround_ = (), productArn :: Value Text
productArn = Value Text
productArn}
instance ToResourceProperties ProductSubscription where
toResourceProperties :: ProductSubscription -> ResourceProperties
toResourceProperties ProductSubscription {()
Value Text
haddock_workaround_ :: ProductSubscription -> ()
productArn :: ProductSubscription -> Value Text
haddock_workaround_ :: ()
productArn :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::SecurityHub::ProductSubscription",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"ProductArn" 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
productArn]}
instance JSON.ToJSON ProductSubscription where
toJSON :: ProductSubscription -> Value
toJSON ProductSubscription {()
Value Text
haddock_workaround_ :: ProductSubscription -> ()
productArn :: ProductSubscription -> Value Text
haddock_workaround_ :: ()
productArn :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object [Key
"ProductArn" 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
productArn]
instance Property "ProductArn" ProductSubscription where
type PropertyType "ProductArn" ProductSubscription = Value Prelude.Text
set :: PropertyType "ProductArn" ProductSubscription
-> ProductSubscription -> ProductSubscription
set PropertyType "ProductArn" ProductSubscription
newValue ProductSubscription {()
Value Text
haddock_workaround_ :: ProductSubscription -> ()
productArn :: ProductSubscription -> Value Text
haddock_workaround_ :: ()
productArn :: Value Text
..}
= ProductSubscription {productArn :: Value Text
productArn = PropertyType "ProductArn" ProductSubscription
Value Text
newValue, ()
haddock_workaround_ :: ()
haddock_workaround_ :: ()
..}