module Stratosphere.DataZone.DataSource.SageMakerRunConfigurationInputProperty (
SageMakerRunConfigurationInputProperty(..),
mkSageMakerRunConfigurationInputProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
data SageMakerRunConfigurationInputProperty
=
SageMakerRunConfigurationInputProperty {SageMakerRunConfigurationInputProperty -> ()
haddock_workaround_ :: (),
SageMakerRunConfigurationInputProperty -> Object
trackingAssets :: JSON.Object}
deriving stock (SageMakerRunConfigurationInputProperty
-> SageMakerRunConfigurationInputProperty -> Bool
(SageMakerRunConfigurationInputProperty
-> SageMakerRunConfigurationInputProperty -> Bool)
-> (SageMakerRunConfigurationInputProperty
-> SageMakerRunConfigurationInputProperty -> Bool)
-> Eq SageMakerRunConfigurationInputProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SageMakerRunConfigurationInputProperty
-> SageMakerRunConfigurationInputProperty -> Bool
== :: SageMakerRunConfigurationInputProperty
-> SageMakerRunConfigurationInputProperty -> Bool
$c/= :: SageMakerRunConfigurationInputProperty
-> SageMakerRunConfigurationInputProperty -> Bool
/= :: SageMakerRunConfigurationInputProperty
-> SageMakerRunConfigurationInputProperty -> Bool
Prelude.Eq, Int -> SageMakerRunConfigurationInputProperty -> ShowS
[SageMakerRunConfigurationInputProperty] -> ShowS
SageMakerRunConfigurationInputProperty -> String
(Int -> SageMakerRunConfigurationInputProperty -> ShowS)
-> (SageMakerRunConfigurationInputProperty -> String)
-> ([SageMakerRunConfigurationInputProperty] -> ShowS)
-> Show SageMakerRunConfigurationInputProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SageMakerRunConfigurationInputProperty -> ShowS
showsPrec :: Int -> SageMakerRunConfigurationInputProperty -> ShowS
$cshow :: SageMakerRunConfigurationInputProperty -> String
show :: SageMakerRunConfigurationInputProperty -> String
$cshowList :: [SageMakerRunConfigurationInputProperty] -> ShowS
showList :: [SageMakerRunConfigurationInputProperty] -> ShowS
Prelude.Show)
mkSageMakerRunConfigurationInputProperty ::
JSON.Object -> SageMakerRunConfigurationInputProperty
mkSageMakerRunConfigurationInputProperty :: Object -> SageMakerRunConfigurationInputProperty
mkSageMakerRunConfigurationInputProperty Object
trackingAssets
= SageMakerRunConfigurationInputProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), trackingAssets :: Object
trackingAssets = Object
trackingAssets}
instance ToResourceProperties SageMakerRunConfigurationInputProperty where
toResourceProperties :: SageMakerRunConfigurationInputProperty -> ResourceProperties
toResourceProperties SageMakerRunConfigurationInputProperty {()
Object
haddock_workaround_ :: SageMakerRunConfigurationInputProperty -> ()
trackingAssets :: SageMakerRunConfigurationInputProperty -> Object
haddock_workaround_ :: ()
trackingAssets :: Object
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::DataZone::DataSource.SageMakerRunConfigurationInput",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"TrackingAssets" Key -> Object -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Object
trackingAssets]}
instance JSON.ToJSON SageMakerRunConfigurationInputProperty where
toJSON :: SageMakerRunConfigurationInputProperty -> Value
toJSON SageMakerRunConfigurationInputProperty {()
Object
haddock_workaround_ :: SageMakerRunConfigurationInputProperty -> ()
trackingAssets :: SageMakerRunConfigurationInputProperty -> Object
haddock_workaround_ :: ()
trackingAssets :: Object
..}
= [(Key, Value)] -> Value
JSON.object [Key
"TrackingAssets" Key -> Object -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Object
trackingAssets]
instance Property "TrackingAssets" SageMakerRunConfigurationInputProperty where
type PropertyType "TrackingAssets" SageMakerRunConfigurationInputProperty = JSON.Object
set :: PropertyType
"TrackingAssets" SageMakerRunConfigurationInputProperty
-> SageMakerRunConfigurationInputProperty
-> SageMakerRunConfigurationInputProperty
set PropertyType
"TrackingAssets" SageMakerRunConfigurationInputProperty
newValue SageMakerRunConfigurationInputProperty {()
Object
haddock_workaround_ :: SageMakerRunConfigurationInputProperty -> ()
trackingAssets :: SageMakerRunConfigurationInputProperty -> Object
haddock_workaround_ :: ()
trackingAssets :: Object
..}
= SageMakerRunConfigurationInputProperty
{trackingAssets :: Object
trackingAssets = Object
PropertyType
"TrackingAssets" SageMakerRunConfigurationInputProperty
newValue, ()
haddock_workaround_ :: ()
haddock_workaround_ :: ()
..}