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