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