module Stratosphere.Budgets.BudgetsAction.ActionThresholdProperty (
        ActionThresholdProperty(..), mkActionThresholdProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data ActionThresholdProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-budgets-budgetsaction-actionthreshold.html>
    ActionThresholdProperty {ActionThresholdProperty -> ()
haddock_workaround_ :: (),
                             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-budgets-budgetsaction-actionthreshold.html#cfn-budgets-budgetsaction-actionthreshold-type>
                             ActionThresholdProperty -> Value Text
type' :: (Value Prelude.Text),
                             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-budgets-budgetsaction-actionthreshold.html#cfn-budgets-budgetsaction-actionthreshold-value>
                             ActionThresholdProperty -> Value Double
value :: (Value Prelude.Double)}
  deriving stock (ActionThresholdProperty -> ActionThresholdProperty -> Bool
(ActionThresholdProperty -> ActionThresholdProperty -> Bool)
-> (ActionThresholdProperty -> ActionThresholdProperty -> Bool)
-> Eq ActionThresholdProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ActionThresholdProperty -> ActionThresholdProperty -> Bool
== :: ActionThresholdProperty -> ActionThresholdProperty -> Bool
$c/= :: ActionThresholdProperty -> ActionThresholdProperty -> Bool
/= :: ActionThresholdProperty -> ActionThresholdProperty -> Bool
Prelude.Eq, Int -> ActionThresholdProperty -> ShowS
[ActionThresholdProperty] -> ShowS
ActionThresholdProperty -> String
(Int -> ActionThresholdProperty -> ShowS)
-> (ActionThresholdProperty -> String)
-> ([ActionThresholdProperty] -> ShowS)
-> Show ActionThresholdProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ActionThresholdProperty -> ShowS
showsPrec :: Int -> ActionThresholdProperty -> ShowS
$cshow :: ActionThresholdProperty -> String
show :: ActionThresholdProperty -> String
$cshowList :: [ActionThresholdProperty] -> ShowS
showList :: [ActionThresholdProperty] -> ShowS
Prelude.Show)
mkActionThresholdProperty ::
  Value Prelude.Text
  -> Value Prelude.Double -> ActionThresholdProperty
mkActionThresholdProperty :: Value Text -> Value Double -> ActionThresholdProperty
mkActionThresholdProperty Value Text
type' Value Double
value
  = ActionThresholdProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), type' :: Value Text
type' = Value Text
type', value :: Value Double
value = Value Double
value}
instance ToResourceProperties ActionThresholdProperty where
  toResourceProperties :: ActionThresholdProperty -> ResourceProperties
toResourceProperties ActionThresholdProperty {()
Value Double
Value Text
haddock_workaround_ :: ActionThresholdProperty -> ()
type' :: ActionThresholdProperty -> Value Text
value :: ActionThresholdProperty -> Value Double
haddock_workaround_ :: ()
type' :: Value Text
value :: Value Double
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::Budgets::BudgetsAction.ActionThreshold",
         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', Key
"Value" Key -> Value Double -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Double
value]}
instance JSON.ToJSON ActionThresholdProperty where
  toJSON :: ActionThresholdProperty -> Value
toJSON ActionThresholdProperty {()
Value Double
Value Text
haddock_workaround_ :: ActionThresholdProperty -> ()
type' :: ActionThresholdProperty -> Value Text
value :: ActionThresholdProperty -> Value Double
haddock_workaround_ :: ()
type' :: Value Text
value :: Value Double
..}
    = [(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', Key
"Value" Key -> Value Double -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Double
value]
instance Property "Type" ActionThresholdProperty where
  type PropertyType "Type" ActionThresholdProperty = Value Prelude.Text
  set :: PropertyType "Type" ActionThresholdProperty
-> ActionThresholdProperty -> ActionThresholdProperty
set PropertyType "Type" ActionThresholdProperty
newValue ActionThresholdProperty {()
Value Double
Value Text
haddock_workaround_ :: ActionThresholdProperty -> ()
type' :: ActionThresholdProperty -> Value Text
value :: ActionThresholdProperty -> Value Double
haddock_workaround_ :: ()
type' :: Value Text
value :: Value Double
..}
    = ActionThresholdProperty {type' :: Value Text
type' = PropertyType "Type" ActionThresholdProperty
Value Text
newValue, ()
Value Double
haddock_workaround_ :: ()
value :: Value Double
haddock_workaround_ :: ()
value :: Value Double
..}
instance Property "Value" ActionThresholdProperty where
  type PropertyType "Value" ActionThresholdProperty = Value Prelude.Double
  set :: PropertyType "Value" ActionThresholdProperty
-> ActionThresholdProperty -> ActionThresholdProperty
set PropertyType "Value" ActionThresholdProperty
newValue ActionThresholdProperty {()
Value Double
Value Text
haddock_workaround_ :: ActionThresholdProperty -> ()
type' :: ActionThresholdProperty -> Value Text
value :: ActionThresholdProperty -> Value Double
haddock_workaround_ :: ()
type' :: Value Text
value :: Value Double
..}
    = ActionThresholdProperty {value :: Value Double
value = PropertyType "Value" ActionThresholdProperty
Value Double
newValue, ()
Value Text
haddock_workaround_ :: ()
type' :: Value Text
haddock_workaround_ :: ()
type' :: Value Text
..}