module Stratosphere.SageMaker.InferenceComponent.DeployedImageProperty (
DeployedImageProperty(..), mkDeployedImageProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data DeployedImageProperty
=
DeployedImageProperty {DeployedImageProperty -> ()
haddock_workaround_ :: (),
DeployedImageProperty -> Maybe (Value Text)
resolutionTime :: (Prelude.Maybe (Value Prelude.Text)),
DeployedImageProperty -> Maybe (Value Text)
resolvedImage :: (Prelude.Maybe (Value Prelude.Text)),
DeployedImageProperty -> Maybe (Value Text)
specifiedImage :: (Prelude.Maybe (Value Prelude.Text))}
deriving stock (DeployedImageProperty -> DeployedImageProperty -> Bool
(DeployedImageProperty -> DeployedImageProperty -> Bool)
-> (DeployedImageProperty -> DeployedImageProperty -> Bool)
-> Eq DeployedImageProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: DeployedImageProperty -> DeployedImageProperty -> Bool
== :: DeployedImageProperty -> DeployedImageProperty -> Bool
$c/= :: DeployedImageProperty -> DeployedImageProperty -> Bool
/= :: DeployedImageProperty -> DeployedImageProperty -> Bool
Prelude.Eq, Int -> DeployedImageProperty -> ShowS
[DeployedImageProperty] -> ShowS
DeployedImageProperty -> String
(Int -> DeployedImageProperty -> ShowS)
-> (DeployedImageProperty -> String)
-> ([DeployedImageProperty] -> ShowS)
-> Show DeployedImageProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> DeployedImageProperty -> ShowS
showsPrec :: Int -> DeployedImageProperty -> ShowS
$cshow :: DeployedImageProperty -> String
show :: DeployedImageProperty -> String
$cshowList :: [DeployedImageProperty] -> ShowS
showList :: [DeployedImageProperty] -> ShowS
Prelude.Show)
mkDeployedImageProperty :: DeployedImageProperty
mkDeployedImageProperty :: DeployedImageProperty
mkDeployedImageProperty
= DeployedImageProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), resolutionTime :: Maybe (Value Text)
resolutionTime = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
resolvedImage :: Maybe (Value Text)
resolvedImage = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, specifiedImage :: Maybe (Value Text)
specifiedImage = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties DeployedImageProperty where
toResourceProperties :: DeployedImageProperty -> ResourceProperties
toResourceProperties DeployedImageProperty {Maybe (Value Text)
()
haddock_workaround_ :: DeployedImageProperty -> ()
resolutionTime :: DeployedImageProperty -> Maybe (Value Text)
resolvedImage :: DeployedImageProperty -> Maybe (Value Text)
specifiedImage :: DeployedImageProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
resolutionTime :: Maybe (Value Text)
resolvedImage :: Maybe (Value Text)
specifiedImage :: Maybe (Value Text)
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::SageMaker::InferenceComponent.DeployedImage",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[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..=) Key
"ResolutionTime" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
resolutionTime,
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..=) Key
"ResolvedImage" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
resolvedImage,
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..=) Key
"SpecifiedImage" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
specifiedImage])}
instance JSON.ToJSON DeployedImageProperty where
toJSON :: DeployedImageProperty -> Value
toJSON DeployedImageProperty {Maybe (Value Text)
()
haddock_workaround_ :: DeployedImageProperty -> ()
resolutionTime :: DeployedImageProperty -> Maybe (Value Text)
resolvedImage :: DeployedImageProperty -> Maybe (Value Text)
specifiedImage :: DeployedImageProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
resolutionTime :: Maybe (Value Text)
resolvedImage :: Maybe (Value Text)
specifiedImage :: Maybe (Value Text)
..}
= [(Key, Value)] -> Value
JSON.object
([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[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..=) Key
"ResolutionTime" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
resolutionTime,
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..=) Key
"ResolvedImage" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
resolvedImage,
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..=) Key
"SpecifiedImage" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
specifiedImage]))
instance Property "ResolutionTime" DeployedImageProperty where
type PropertyType "ResolutionTime" DeployedImageProperty = Value Prelude.Text
set :: PropertyType "ResolutionTime" DeployedImageProperty
-> DeployedImageProperty -> DeployedImageProperty
set PropertyType "ResolutionTime" DeployedImageProperty
newValue DeployedImageProperty {Maybe (Value Text)
()
haddock_workaround_ :: DeployedImageProperty -> ()
resolutionTime :: DeployedImageProperty -> Maybe (Value Text)
resolvedImage :: DeployedImageProperty -> Maybe (Value Text)
specifiedImage :: DeployedImageProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
resolutionTime :: Maybe (Value Text)
resolvedImage :: Maybe (Value Text)
specifiedImage :: Maybe (Value Text)
..}
= DeployedImageProperty
{resolutionTime :: Maybe (Value Text)
resolutionTime = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ResolutionTime" DeployedImageProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
resolvedImage :: Maybe (Value Text)
specifiedImage :: Maybe (Value Text)
haddock_workaround_ :: ()
resolvedImage :: Maybe (Value Text)
specifiedImage :: Maybe (Value Text)
..}
instance Property "ResolvedImage" DeployedImageProperty where
type PropertyType "ResolvedImage" DeployedImageProperty = Value Prelude.Text
set :: PropertyType "ResolvedImage" DeployedImageProperty
-> DeployedImageProperty -> DeployedImageProperty
set PropertyType "ResolvedImage" DeployedImageProperty
newValue DeployedImageProperty {Maybe (Value Text)
()
haddock_workaround_ :: DeployedImageProperty -> ()
resolutionTime :: DeployedImageProperty -> Maybe (Value Text)
resolvedImage :: DeployedImageProperty -> Maybe (Value Text)
specifiedImage :: DeployedImageProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
resolutionTime :: Maybe (Value Text)
resolvedImage :: Maybe (Value Text)
specifiedImage :: Maybe (Value Text)
..}
= DeployedImageProperty {resolvedImage :: Maybe (Value Text)
resolvedImage = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ResolvedImage" DeployedImageProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
resolutionTime :: Maybe (Value Text)
specifiedImage :: Maybe (Value Text)
haddock_workaround_ :: ()
resolutionTime :: Maybe (Value Text)
specifiedImage :: Maybe (Value Text)
..}
instance Property "SpecifiedImage" DeployedImageProperty where
type PropertyType "SpecifiedImage" DeployedImageProperty = Value Prelude.Text
set :: PropertyType "SpecifiedImage" DeployedImageProperty
-> DeployedImageProperty -> DeployedImageProperty
set PropertyType "SpecifiedImage" DeployedImageProperty
newValue DeployedImageProperty {Maybe (Value Text)
()
haddock_workaround_ :: DeployedImageProperty -> ()
resolutionTime :: DeployedImageProperty -> Maybe (Value Text)
resolvedImage :: DeployedImageProperty -> Maybe (Value Text)
specifiedImage :: DeployedImageProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
resolutionTime :: Maybe (Value Text)
resolvedImage :: Maybe (Value Text)
specifiedImage :: Maybe (Value Text)
..}
= DeployedImageProperty
{specifiedImage :: Maybe (Value Text)
specifiedImage = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "SpecifiedImage" DeployedImageProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
resolutionTime :: Maybe (Value Text)
resolvedImage :: Maybe (Value Text)
haddock_workaround_ :: ()
resolutionTime :: Maybe (Value Text)
resolvedImage :: Maybe (Value Text)
..}