module Stratosphere.SageMaker.InferenceExperiment.RealTimeInferenceConfigProperty (
        RealTimeInferenceConfigProperty(..),
        mkRealTimeInferenceConfigProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data RealTimeInferenceConfigProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-sagemaker-inferenceexperiment-realtimeinferenceconfig.html>
    RealTimeInferenceConfigProperty {RealTimeInferenceConfigProperty -> ()
haddock_workaround_ :: (),
                                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-sagemaker-inferenceexperiment-realtimeinferenceconfig.html#cfn-sagemaker-inferenceexperiment-realtimeinferenceconfig-instancecount>
                                     RealTimeInferenceConfigProperty -> Value Integer
instanceCount :: (Value Prelude.Integer),
                                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-sagemaker-inferenceexperiment-realtimeinferenceconfig.html#cfn-sagemaker-inferenceexperiment-realtimeinferenceconfig-instancetype>
                                     RealTimeInferenceConfigProperty -> Value Text
instanceType :: (Value Prelude.Text)}
  deriving stock (RealTimeInferenceConfigProperty
-> RealTimeInferenceConfigProperty -> Bool
(RealTimeInferenceConfigProperty
 -> RealTimeInferenceConfigProperty -> Bool)
-> (RealTimeInferenceConfigProperty
    -> RealTimeInferenceConfigProperty -> Bool)
-> Eq RealTimeInferenceConfigProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: RealTimeInferenceConfigProperty
-> RealTimeInferenceConfigProperty -> Bool
== :: RealTimeInferenceConfigProperty
-> RealTimeInferenceConfigProperty -> Bool
$c/= :: RealTimeInferenceConfigProperty
-> RealTimeInferenceConfigProperty -> Bool
/= :: RealTimeInferenceConfigProperty
-> RealTimeInferenceConfigProperty -> Bool
Prelude.Eq, Int -> RealTimeInferenceConfigProperty -> ShowS
[RealTimeInferenceConfigProperty] -> ShowS
RealTimeInferenceConfigProperty -> String
(Int -> RealTimeInferenceConfigProperty -> ShowS)
-> (RealTimeInferenceConfigProperty -> String)
-> ([RealTimeInferenceConfigProperty] -> ShowS)
-> Show RealTimeInferenceConfigProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> RealTimeInferenceConfigProperty -> ShowS
showsPrec :: Int -> RealTimeInferenceConfigProperty -> ShowS
$cshow :: RealTimeInferenceConfigProperty -> String
show :: RealTimeInferenceConfigProperty -> String
$cshowList :: [RealTimeInferenceConfigProperty] -> ShowS
showList :: [RealTimeInferenceConfigProperty] -> ShowS
Prelude.Show)
mkRealTimeInferenceConfigProperty ::
  Value Prelude.Integer
  -> Value Prelude.Text -> RealTimeInferenceConfigProperty
mkRealTimeInferenceConfigProperty :: Value Integer -> Value Text -> RealTimeInferenceConfigProperty
mkRealTimeInferenceConfigProperty Value Integer
instanceCount Value Text
instanceType
  = RealTimeInferenceConfigProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), instanceCount :: Value Integer
instanceCount = Value Integer
instanceCount,
       instanceType :: Value Text
instanceType = Value Text
instanceType}
instance ToResourceProperties RealTimeInferenceConfigProperty where
  toResourceProperties :: RealTimeInferenceConfigProperty -> ResourceProperties
toResourceProperties RealTimeInferenceConfigProperty {()
Value Integer
Value Text
haddock_workaround_ :: RealTimeInferenceConfigProperty -> ()
instanceCount :: RealTimeInferenceConfigProperty -> Value Integer
instanceType :: RealTimeInferenceConfigProperty -> Value Text
haddock_workaround_ :: ()
instanceCount :: Value Integer
instanceType :: Value Text
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::SageMaker::InferenceExperiment.RealTimeInferenceConfig",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Key
"InstanceCount" Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Integer
instanceCount,
                       Key
"InstanceType" 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
instanceType]}
instance JSON.ToJSON RealTimeInferenceConfigProperty where
  toJSON :: RealTimeInferenceConfigProperty -> Value
toJSON RealTimeInferenceConfigProperty {()
Value Integer
Value Text
haddock_workaround_ :: RealTimeInferenceConfigProperty -> ()
instanceCount :: RealTimeInferenceConfigProperty -> Value Integer
instanceType :: RealTimeInferenceConfigProperty -> Value Text
haddock_workaround_ :: ()
instanceCount :: Value Integer
instanceType :: Value Text
..}
    = [(Key, Value)] -> Value
JSON.object
        [Key
"InstanceCount" Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Integer
instanceCount,
         Key
"InstanceType" 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
instanceType]
instance Property "InstanceCount" RealTimeInferenceConfigProperty where
  type PropertyType "InstanceCount" RealTimeInferenceConfigProperty = Value Prelude.Integer
  set :: PropertyType "InstanceCount" RealTimeInferenceConfigProperty
-> RealTimeInferenceConfigProperty
-> RealTimeInferenceConfigProperty
set PropertyType "InstanceCount" RealTimeInferenceConfigProperty
newValue RealTimeInferenceConfigProperty {()
Value Integer
Value Text
haddock_workaround_ :: RealTimeInferenceConfigProperty -> ()
instanceCount :: RealTimeInferenceConfigProperty -> Value Integer
instanceType :: RealTimeInferenceConfigProperty -> Value Text
haddock_workaround_ :: ()
instanceCount :: Value Integer
instanceType :: Value Text
..}
    = RealTimeInferenceConfigProperty {instanceCount :: Value Integer
instanceCount = PropertyType "InstanceCount" RealTimeInferenceConfigProperty
Value Integer
newValue, ()
Value Text
haddock_workaround_ :: ()
instanceType :: Value Text
haddock_workaround_ :: ()
instanceType :: Value Text
..}
instance Property "InstanceType" RealTimeInferenceConfigProperty where
  type PropertyType "InstanceType" RealTimeInferenceConfigProperty = Value Prelude.Text
  set :: PropertyType "InstanceType" RealTimeInferenceConfigProperty
-> RealTimeInferenceConfigProperty
-> RealTimeInferenceConfigProperty
set PropertyType "InstanceType" RealTimeInferenceConfigProperty
newValue RealTimeInferenceConfigProperty {()
Value Integer
Value Text
haddock_workaround_ :: RealTimeInferenceConfigProperty -> ()
instanceCount :: RealTimeInferenceConfigProperty -> Value Integer
instanceType :: RealTimeInferenceConfigProperty -> Value Text
haddock_workaround_ :: ()
instanceCount :: Value Integer
instanceType :: Value Text
..}
    = RealTimeInferenceConfigProperty {instanceType :: Value Text
instanceType = PropertyType "InstanceType" RealTimeInferenceConfigProperty
Value Text
newValue, ()
Value Integer
haddock_workaround_ :: ()
instanceCount :: Value Integer
haddock_workaround_ :: ()
instanceCount :: Value Integer
..}