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