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