module Stratosphere.WAFv2.WebACL.ResponseInspectionHeaderProperty (
ResponseInspectionHeaderProperty(..),
mkResponseInspectionHeaderProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data
=
{ResponseInspectionHeaderProperty -> ()
haddock_workaround_ :: (),
ResponseInspectionHeaderProperty -> ValueList Text
failureValues :: (ValueList Prelude.Text),
ResponseInspectionHeaderProperty -> Value Text
name :: (Value Prelude.Text),
ResponseInspectionHeaderProperty -> ValueList Text
successValues :: (ValueList Prelude.Text)}
deriving stock (ResponseInspectionHeaderProperty
-> ResponseInspectionHeaderProperty -> Bool
(ResponseInspectionHeaderProperty
-> ResponseInspectionHeaderProperty -> Bool)
-> (ResponseInspectionHeaderProperty
-> ResponseInspectionHeaderProperty -> Bool)
-> Eq ResponseInspectionHeaderProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ResponseInspectionHeaderProperty
-> ResponseInspectionHeaderProperty -> Bool
== :: ResponseInspectionHeaderProperty
-> ResponseInspectionHeaderProperty -> Bool
$c/= :: ResponseInspectionHeaderProperty
-> ResponseInspectionHeaderProperty -> Bool
/= :: ResponseInspectionHeaderProperty
-> ResponseInspectionHeaderProperty -> Bool
Prelude.Eq, Int -> ResponseInspectionHeaderProperty -> ShowS
[ResponseInspectionHeaderProperty] -> ShowS
ResponseInspectionHeaderProperty -> String
(Int -> ResponseInspectionHeaderProperty -> ShowS)
-> (ResponseInspectionHeaderProperty -> String)
-> ([ResponseInspectionHeaderProperty] -> ShowS)
-> Show ResponseInspectionHeaderProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ResponseInspectionHeaderProperty -> ShowS
showsPrec :: Int -> ResponseInspectionHeaderProperty -> ShowS
$cshow :: ResponseInspectionHeaderProperty -> String
show :: ResponseInspectionHeaderProperty -> String
$cshowList :: [ResponseInspectionHeaderProperty] -> ShowS
showList :: [ResponseInspectionHeaderProperty] -> ShowS
Prelude.Show)
mkResponseInspectionHeaderProperty ::
ValueList Prelude.Text
-> Value Prelude.Text
-> ValueList Prelude.Text -> ResponseInspectionHeaderProperty
ValueList Text
failureValues Value Text
name ValueList Text
successValues
= ResponseInspectionHeaderProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), failureValues :: ValueList Text
failureValues = ValueList Text
failureValues,
name :: Value Text
name = Value Text
name, successValues :: ValueList Text
successValues = ValueList Text
successValues}
instance ToResourceProperties ResponseInspectionHeaderProperty where
toResourceProperties :: ResponseInspectionHeaderProperty -> ResourceProperties
toResourceProperties ResponseInspectionHeaderProperty {()
ValueList Text
Value Text
haddock_workaround_ :: ResponseInspectionHeaderProperty -> ()
failureValues :: ResponseInspectionHeaderProperty -> ValueList Text
name :: ResponseInspectionHeaderProperty -> Value Text
successValues :: ResponseInspectionHeaderProperty -> ValueList Text
haddock_workaround_ :: ()
failureValues :: ValueList Text
name :: Value Text
successValues :: ValueList Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::WAFv2::WebACL.ResponseInspectionHeader",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"FailureValues" Key -> ValueList Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= ValueList Text
failureValues,
Key
"Name" 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
name, Key
"SuccessValues" Key -> ValueList Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= ValueList Text
successValues]}
instance JSON.ToJSON ResponseInspectionHeaderProperty where
toJSON :: ResponseInspectionHeaderProperty -> Value
toJSON ResponseInspectionHeaderProperty {()
ValueList Text
Value Text
haddock_workaround_ :: ResponseInspectionHeaderProperty -> ()
failureValues :: ResponseInspectionHeaderProperty -> ValueList Text
name :: ResponseInspectionHeaderProperty -> Value Text
successValues :: ResponseInspectionHeaderProperty -> ValueList Text
haddock_workaround_ :: ()
failureValues :: ValueList Text
name :: Value Text
successValues :: ValueList Text
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"FailureValues" Key -> ValueList Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= ValueList Text
failureValues, Key
"Name" 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
name,
Key
"SuccessValues" Key -> ValueList Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= ValueList Text
successValues]
instance Property "FailureValues" ResponseInspectionHeaderProperty where
type PropertyType "FailureValues" ResponseInspectionHeaderProperty = ValueList Prelude.Text
set :: PropertyType "FailureValues" ResponseInspectionHeaderProperty
-> ResponseInspectionHeaderProperty
-> ResponseInspectionHeaderProperty
set PropertyType "FailureValues" ResponseInspectionHeaderProperty
newValue ResponseInspectionHeaderProperty {()
ValueList Text
Value Text
haddock_workaround_ :: ResponseInspectionHeaderProperty -> ()
failureValues :: ResponseInspectionHeaderProperty -> ValueList Text
name :: ResponseInspectionHeaderProperty -> Value Text
successValues :: ResponseInspectionHeaderProperty -> ValueList Text
haddock_workaround_ :: ()
failureValues :: ValueList Text
name :: Value Text
successValues :: ValueList Text
..}
= ResponseInspectionHeaderProperty {failureValues :: ValueList Text
failureValues = PropertyType "FailureValues" ResponseInspectionHeaderProperty
ValueList Text
newValue, ()
ValueList Text
Value Text
haddock_workaround_ :: ()
name :: Value Text
successValues :: ValueList Text
haddock_workaround_ :: ()
name :: Value Text
successValues :: ValueList Text
..}
instance Property "Name" ResponseInspectionHeaderProperty where
type PropertyType "Name" ResponseInspectionHeaderProperty = Value Prelude.Text
set :: PropertyType "Name" ResponseInspectionHeaderProperty
-> ResponseInspectionHeaderProperty
-> ResponseInspectionHeaderProperty
set PropertyType "Name" ResponseInspectionHeaderProperty
newValue ResponseInspectionHeaderProperty {()
ValueList Text
Value Text
haddock_workaround_ :: ResponseInspectionHeaderProperty -> ()
failureValues :: ResponseInspectionHeaderProperty -> ValueList Text
name :: ResponseInspectionHeaderProperty -> Value Text
successValues :: ResponseInspectionHeaderProperty -> ValueList Text
haddock_workaround_ :: ()
failureValues :: ValueList Text
name :: Value Text
successValues :: ValueList Text
..}
= ResponseInspectionHeaderProperty {name :: Value Text
name = PropertyType "Name" ResponseInspectionHeaderProperty
Value Text
newValue, ()
ValueList Text
haddock_workaround_ :: ()
failureValues :: ValueList Text
successValues :: ValueList Text
haddock_workaround_ :: ()
failureValues :: ValueList Text
successValues :: ValueList Text
..}
instance Property "SuccessValues" ResponseInspectionHeaderProperty where
type PropertyType "SuccessValues" ResponseInspectionHeaderProperty = ValueList Prelude.Text
set :: PropertyType "SuccessValues" ResponseInspectionHeaderProperty
-> ResponseInspectionHeaderProperty
-> ResponseInspectionHeaderProperty
set PropertyType "SuccessValues" ResponseInspectionHeaderProperty
newValue ResponseInspectionHeaderProperty {()
ValueList Text
Value Text
haddock_workaround_ :: ResponseInspectionHeaderProperty -> ()
failureValues :: ResponseInspectionHeaderProperty -> ValueList Text
name :: ResponseInspectionHeaderProperty -> Value Text
successValues :: ResponseInspectionHeaderProperty -> ValueList Text
haddock_workaround_ :: ()
failureValues :: ValueList Text
name :: Value Text
successValues :: ValueList Text
..}
= ResponseInspectionHeaderProperty {successValues :: ValueList Text
successValues = PropertyType "SuccessValues" ResponseInspectionHeaderProperty
ValueList Text
newValue, ()
ValueList Text
Value Text
haddock_workaround_ :: ()
failureValues :: ValueList Text
name :: Value Text
haddock_workaround_ :: ()
failureValues :: ValueList Text
name :: Value Text
..}