module Stratosphere.AppRunner.Service.SourceCodeVersionProperty (
SourceCodeVersionProperty(..), mkSourceCodeVersionProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data SourceCodeVersionProperty
=
SourceCodeVersionProperty {SourceCodeVersionProperty -> ()
haddock_workaround_ :: (),
SourceCodeVersionProperty -> Value Text
type' :: (Value Prelude.Text),
SourceCodeVersionProperty -> Value Text
value :: (Value Prelude.Text)}
deriving stock (SourceCodeVersionProperty -> SourceCodeVersionProperty -> Bool
(SourceCodeVersionProperty -> SourceCodeVersionProperty -> Bool)
-> (SourceCodeVersionProperty -> SourceCodeVersionProperty -> Bool)
-> Eq SourceCodeVersionProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SourceCodeVersionProperty -> SourceCodeVersionProperty -> Bool
== :: SourceCodeVersionProperty -> SourceCodeVersionProperty -> Bool
$c/= :: SourceCodeVersionProperty -> SourceCodeVersionProperty -> Bool
/= :: SourceCodeVersionProperty -> SourceCodeVersionProperty -> Bool
Prelude.Eq, Int -> SourceCodeVersionProperty -> ShowS
[SourceCodeVersionProperty] -> ShowS
SourceCodeVersionProperty -> String
(Int -> SourceCodeVersionProperty -> ShowS)
-> (SourceCodeVersionProperty -> String)
-> ([SourceCodeVersionProperty] -> ShowS)
-> Show SourceCodeVersionProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SourceCodeVersionProperty -> ShowS
showsPrec :: Int -> SourceCodeVersionProperty -> ShowS
$cshow :: SourceCodeVersionProperty -> String
show :: SourceCodeVersionProperty -> String
$cshowList :: [SourceCodeVersionProperty] -> ShowS
showList :: [SourceCodeVersionProperty] -> ShowS
Prelude.Show)
mkSourceCodeVersionProperty ::
Value Prelude.Text
-> Value Prelude.Text -> SourceCodeVersionProperty
mkSourceCodeVersionProperty :: Value Text -> Value Text -> SourceCodeVersionProperty
mkSourceCodeVersionProperty Value Text
type' Value Text
value
= SourceCodeVersionProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), type' :: Value Text
type' = Value Text
type', value :: Value Text
value = Value Text
value}
instance ToResourceProperties SourceCodeVersionProperty where
toResourceProperties :: SourceCodeVersionProperty -> ResourceProperties
toResourceProperties SourceCodeVersionProperty {()
Value Text
haddock_workaround_ :: SourceCodeVersionProperty -> ()
type' :: SourceCodeVersionProperty -> Value Text
value :: SourceCodeVersionProperty -> Value Text
haddock_workaround_ :: ()
type' :: Value Text
value :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::AppRunner::Service.SourceCodeVersion",
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 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
value]}
instance JSON.ToJSON SourceCodeVersionProperty where
toJSON :: SourceCodeVersionProperty -> Value
toJSON SourceCodeVersionProperty {()
Value Text
haddock_workaround_ :: SourceCodeVersionProperty -> ()
type' :: SourceCodeVersionProperty -> Value Text
value :: SourceCodeVersionProperty -> Value Text
haddock_workaround_ :: ()
type' :: Value Text
value :: Value Text
..}
= [(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 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
value]
instance Property "Type" SourceCodeVersionProperty where
type PropertyType "Type" SourceCodeVersionProperty = Value Prelude.Text
set :: PropertyType "Type" SourceCodeVersionProperty
-> SourceCodeVersionProperty -> SourceCodeVersionProperty
set PropertyType "Type" SourceCodeVersionProperty
newValue SourceCodeVersionProperty {()
Value Text
haddock_workaround_ :: SourceCodeVersionProperty -> ()
type' :: SourceCodeVersionProperty -> Value Text
value :: SourceCodeVersionProperty -> Value Text
haddock_workaround_ :: ()
type' :: Value Text
value :: Value Text
..}
= SourceCodeVersionProperty {type' :: Value Text
type' = PropertyType "Type" SourceCodeVersionProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
value :: Value Text
haddock_workaround_ :: ()
value :: Value Text
..}
instance Property "Value" SourceCodeVersionProperty where
type PropertyType "Value" SourceCodeVersionProperty = Value Prelude.Text
set :: PropertyType "Value" SourceCodeVersionProperty
-> SourceCodeVersionProperty -> SourceCodeVersionProperty
set PropertyType "Value" SourceCodeVersionProperty
newValue SourceCodeVersionProperty {()
Value Text
haddock_workaround_ :: SourceCodeVersionProperty -> ()
type' :: SourceCodeVersionProperty -> Value Text
value :: SourceCodeVersionProperty -> Value Text
haddock_workaround_ :: ()
type' :: Value Text
value :: Value Text
..}
= SourceCodeVersionProperty {value :: Value Text
value = PropertyType "Value" SourceCodeVersionProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
type' :: Value Text
haddock_workaround_ :: ()
type' :: Value Text
..}