module Stratosphere.Wisdom.AIGuardrail.GuardrailManagedWordsConfigProperty (
        GuardrailManagedWordsConfigProperty(..),
        mkGuardrailManagedWordsConfigProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data GuardrailManagedWordsConfigProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-wisdom-aiguardrail-guardrailmanagedwordsconfig.html>
    GuardrailManagedWordsConfigProperty {GuardrailManagedWordsConfigProperty -> ()
haddock_workaround_ :: (),
                                         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-wisdom-aiguardrail-guardrailmanagedwordsconfig.html#cfn-wisdom-aiguardrail-guardrailmanagedwordsconfig-type>
                                         GuardrailManagedWordsConfigProperty -> Value Text
type' :: (Value Prelude.Text)}
  deriving stock (GuardrailManagedWordsConfigProperty
-> GuardrailManagedWordsConfigProperty -> Bool
(GuardrailManagedWordsConfigProperty
 -> GuardrailManagedWordsConfigProperty -> Bool)
-> (GuardrailManagedWordsConfigProperty
    -> GuardrailManagedWordsConfigProperty -> Bool)
-> Eq GuardrailManagedWordsConfigProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: GuardrailManagedWordsConfigProperty
-> GuardrailManagedWordsConfigProperty -> Bool
== :: GuardrailManagedWordsConfigProperty
-> GuardrailManagedWordsConfigProperty -> Bool
$c/= :: GuardrailManagedWordsConfigProperty
-> GuardrailManagedWordsConfigProperty -> Bool
/= :: GuardrailManagedWordsConfigProperty
-> GuardrailManagedWordsConfigProperty -> Bool
Prelude.Eq, Int -> GuardrailManagedWordsConfigProperty -> ShowS
[GuardrailManagedWordsConfigProperty] -> ShowS
GuardrailManagedWordsConfigProperty -> String
(Int -> GuardrailManagedWordsConfigProperty -> ShowS)
-> (GuardrailManagedWordsConfigProperty -> String)
-> ([GuardrailManagedWordsConfigProperty] -> ShowS)
-> Show GuardrailManagedWordsConfigProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> GuardrailManagedWordsConfigProperty -> ShowS
showsPrec :: Int -> GuardrailManagedWordsConfigProperty -> ShowS
$cshow :: GuardrailManagedWordsConfigProperty -> String
show :: GuardrailManagedWordsConfigProperty -> String
$cshowList :: [GuardrailManagedWordsConfigProperty] -> ShowS
showList :: [GuardrailManagedWordsConfigProperty] -> ShowS
Prelude.Show)
mkGuardrailManagedWordsConfigProperty ::
  Value Prelude.Text -> GuardrailManagedWordsConfigProperty
mkGuardrailManagedWordsConfigProperty :: Value Text -> GuardrailManagedWordsConfigProperty
mkGuardrailManagedWordsConfigProperty Value Text
type'
  = GuardrailManagedWordsConfigProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), type' :: Value Text
type' = Value Text
type'}
instance ToResourceProperties GuardrailManagedWordsConfigProperty where
  toResourceProperties :: GuardrailManagedWordsConfigProperty -> ResourceProperties
toResourceProperties GuardrailManagedWordsConfigProperty {()
Value Text
haddock_workaround_ :: GuardrailManagedWordsConfigProperty -> ()
type' :: GuardrailManagedWordsConfigProperty -> Value Text
haddock_workaround_ :: ()
type' :: Value Text
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::Wisdom::AIGuardrail.GuardrailManagedWordsConfig",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False, properties :: Object
properties = [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']}
instance JSON.ToJSON GuardrailManagedWordsConfigProperty where
  toJSON :: GuardrailManagedWordsConfigProperty -> Value
toJSON GuardrailManagedWordsConfigProperty {()
Value Text
haddock_workaround_ :: GuardrailManagedWordsConfigProperty -> ()
type' :: GuardrailManagedWordsConfigProperty -> Value Text
haddock_workaround_ :: ()
type' :: Value Text
..}
    = [(Key, Value)] -> Value
JSON.object [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']
instance Property "Type" GuardrailManagedWordsConfigProperty where
  type PropertyType "Type" GuardrailManagedWordsConfigProperty = Value Prelude.Text
  set :: PropertyType "Type" GuardrailManagedWordsConfigProperty
-> GuardrailManagedWordsConfigProperty
-> GuardrailManagedWordsConfigProperty
set PropertyType "Type" GuardrailManagedWordsConfigProperty
newValue GuardrailManagedWordsConfigProperty {()
Value Text
haddock_workaround_ :: GuardrailManagedWordsConfigProperty -> ()
type' :: GuardrailManagedWordsConfigProperty -> Value Text
haddock_workaround_ :: ()
type' :: Value Text
..}
    = GuardrailManagedWordsConfigProperty {type' :: Value Text
type' = PropertyType "Type" GuardrailManagedWordsConfigProperty
Value Text
newValue, ()
haddock_workaround_ :: ()
haddock_workaround_ :: ()
..}