module Stratosphere.Synthetics.Canary.CodeProperty (
        module Exports, CodeProperty(..), mkCodeProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.Synthetics.Canary.DependencyProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data CodeProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-synthetics-canary-code.html>
    CodeProperty {CodeProperty -> ()
haddock_workaround_ :: (),
                  -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-synthetics-canary-code.html#cfn-synthetics-canary-code-blueprinttypes>
                  CodeProperty -> Maybe (ValueList Text)
blueprintTypes :: (Prelude.Maybe (ValueList Prelude.Text)),
                  -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-synthetics-canary-code.html#cfn-synthetics-canary-code-dependencies>
                  CodeProperty -> Maybe [DependencyProperty]
dependencies :: (Prelude.Maybe [DependencyProperty]),
                  -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-synthetics-canary-code.html#cfn-synthetics-canary-code-handler>
                  CodeProperty -> Maybe (Value Text)
handler :: (Prelude.Maybe (Value Prelude.Text)),
                  -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-synthetics-canary-code.html#cfn-synthetics-canary-code-s3bucket>
                  CodeProperty -> Maybe (Value Text)
s3Bucket :: (Prelude.Maybe (Value Prelude.Text)),
                  -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-synthetics-canary-code.html#cfn-synthetics-canary-code-s3key>
                  CodeProperty -> Maybe (Value Text)
s3Key :: (Prelude.Maybe (Value Prelude.Text)),
                  -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-synthetics-canary-code.html#cfn-synthetics-canary-code-s3objectversion>
                  CodeProperty -> Maybe (Value Text)
s3ObjectVersion :: (Prelude.Maybe (Value Prelude.Text)),
                  -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-synthetics-canary-code.html#cfn-synthetics-canary-code-script>
                  CodeProperty -> Maybe (Value Text)
script :: (Prelude.Maybe (Value Prelude.Text)),
                  -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-synthetics-canary-code.html#cfn-synthetics-canary-code-sourcelocationarn>
                  CodeProperty -> Maybe (Value Text)
sourceLocationArn :: (Prelude.Maybe (Value Prelude.Text))}
  deriving stock (CodeProperty -> CodeProperty -> Bool
(CodeProperty -> CodeProperty -> Bool)
-> (CodeProperty -> CodeProperty -> Bool) -> Eq CodeProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: CodeProperty -> CodeProperty -> Bool
== :: CodeProperty -> CodeProperty -> Bool
$c/= :: CodeProperty -> CodeProperty -> Bool
/= :: CodeProperty -> CodeProperty -> Bool
Prelude.Eq, Int -> CodeProperty -> ShowS
[CodeProperty] -> ShowS
CodeProperty -> String
(Int -> CodeProperty -> ShowS)
-> (CodeProperty -> String)
-> ([CodeProperty] -> ShowS)
-> Show CodeProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> CodeProperty -> ShowS
showsPrec :: Int -> CodeProperty -> ShowS
$cshow :: CodeProperty -> String
show :: CodeProperty -> String
$cshowList :: [CodeProperty] -> ShowS
showList :: [CodeProperty] -> ShowS
Prelude.Show)
mkCodeProperty :: CodeProperty
mkCodeProperty :: CodeProperty
mkCodeProperty
  = CodeProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), blueprintTypes :: Maybe (ValueList Text)
blueprintTypes = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
       dependencies :: Maybe [DependencyProperty]
dependencies = Maybe [DependencyProperty]
forall a. Maybe a
Prelude.Nothing, handler :: Maybe (Value Text)
handler = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       s3Bucket :: Maybe (Value Text)
s3Bucket = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, s3Key :: Maybe (Value Text)
s3Key = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       s3ObjectVersion :: Maybe (Value Text)
s3ObjectVersion = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, script :: Maybe (Value Text)
script = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       sourceLocationArn :: Maybe (Value Text)
sourceLocationArn = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties CodeProperty where
  toResourceProperties :: CodeProperty -> ResourceProperties
toResourceProperties CodeProperty {Maybe [DependencyProperty]
Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: CodeProperty -> ()
blueprintTypes :: CodeProperty -> Maybe (ValueList Text)
dependencies :: CodeProperty -> Maybe [DependencyProperty]
handler :: CodeProperty -> Maybe (Value Text)
s3Bucket :: CodeProperty -> Maybe (Value Text)
s3Key :: CodeProperty -> Maybe (Value Text)
s3ObjectVersion :: CodeProperty -> Maybe (Value Text)
script :: CodeProperty -> Maybe (Value Text)
sourceLocationArn :: CodeProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::Synthetics::Canary.Code",
         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 -> ValueList 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
"BlueprintTypes" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
blueprintTypes,
                            Key -> [DependencyProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Dependencies" ([DependencyProperty] -> (Key, Value))
-> Maybe [DependencyProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [DependencyProperty]
dependencies,
                            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
"Handler" (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)
handler,
                            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
"S3Bucket" (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)
s3Bucket,
                            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
"S3Key" (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)
s3Key,
                            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
"S3ObjectVersion" (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)
s3ObjectVersion,
                            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
"Script" (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)
script,
                            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
"SourceLocationArn" (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)
sourceLocationArn])}
instance JSON.ToJSON CodeProperty where
  toJSON :: CodeProperty -> Value
toJSON CodeProperty {Maybe [DependencyProperty]
Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: CodeProperty -> ()
blueprintTypes :: CodeProperty -> Maybe (ValueList Text)
dependencies :: CodeProperty -> Maybe [DependencyProperty]
handler :: CodeProperty -> Maybe (Value Text)
s3Bucket :: CodeProperty -> Maybe (Value Text)
s3Key :: CodeProperty -> Maybe (Value Text)
s3ObjectVersion :: CodeProperty -> Maybe (Value Text)
script :: CodeProperty -> Maybe (Value Text)
sourceLocationArn :: CodeProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: 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 -> ValueList 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
"BlueprintTypes" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
blueprintTypes,
               Key -> [DependencyProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Dependencies" ([DependencyProperty] -> (Key, Value))
-> Maybe [DependencyProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [DependencyProperty]
dependencies,
               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
"Handler" (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)
handler,
               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
"S3Bucket" (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)
s3Bucket,
               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
"S3Key" (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)
s3Key,
               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
"S3ObjectVersion" (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)
s3ObjectVersion,
               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
"Script" (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)
script,
               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
"SourceLocationArn" (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)
sourceLocationArn]))
instance Property "BlueprintTypes" CodeProperty where
  type PropertyType "BlueprintTypes" CodeProperty = ValueList Prelude.Text
  set :: PropertyType "BlueprintTypes" CodeProperty
-> CodeProperty -> CodeProperty
set PropertyType "BlueprintTypes" CodeProperty
newValue CodeProperty {Maybe [DependencyProperty]
Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: CodeProperty -> ()
blueprintTypes :: CodeProperty -> Maybe (ValueList Text)
dependencies :: CodeProperty -> Maybe [DependencyProperty]
handler :: CodeProperty -> Maybe (Value Text)
s3Bucket :: CodeProperty -> Maybe (Value Text)
s3Key :: CodeProperty -> Maybe (Value Text)
s3ObjectVersion :: CodeProperty -> Maybe (Value Text)
script :: CodeProperty -> Maybe (Value Text)
sourceLocationArn :: CodeProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
..}
    = CodeProperty {blueprintTypes :: Maybe (ValueList Text)
blueprintTypes = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "BlueprintTypes" CodeProperty
ValueList Text
newValue, Maybe [DependencyProperty]
Maybe (Value Text)
()
haddock_workaround_ :: ()
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
haddock_workaround_ :: ()
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
..}
instance Property "Dependencies" CodeProperty where
  type PropertyType "Dependencies" CodeProperty = [DependencyProperty]
  set :: PropertyType "Dependencies" CodeProperty
-> CodeProperty -> CodeProperty
set PropertyType "Dependencies" CodeProperty
newValue CodeProperty {Maybe [DependencyProperty]
Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: CodeProperty -> ()
blueprintTypes :: CodeProperty -> Maybe (ValueList Text)
dependencies :: CodeProperty -> Maybe [DependencyProperty]
handler :: CodeProperty -> Maybe (Value Text)
s3Bucket :: CodeProperty -> Maybe (Value Text)
s3Key :: CodeProperty -> Maybe (Value Text)
s3ObjectVersion :: CodeProperty -> Maybe (Value Text)
script :: CodeProperty -> Maybe (Value Text)
sourceLocationArn :: CodeProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
..}
    = CodeProperty {dependencies :: Maybe [DependencyProperty]
dependencies = [DependencyProperty] -> Maybe [DependencyProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [DependencyProperty]
PropertyType "Dependencies" CodeProperty
newValue, Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
..}
instance Property "Handler" CodeProperty where
  type PropertyType "Handler" CodeProperty = Value Prelude.Text
  set :: PropertyType "Handler" CodeProperty -> CodeProperty -> CodeProperty
set PropertyType "Handler" CodeProperty
newValue CodeProperty {Maybe [DependencyProperty]
Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: CodeProperty -> ()
blueprintTypes :: CodeProperty -> Maybe (ValueList Text)
dependencies :: CodeProperty -> Maybe [DependencyProperty]
handler :: CodeProperty -> Maybe (Value Text)
s3Bucket :: CodeProperty -> Maybe (Value Text)
s3Key :: CodeProperty -> Maybe (Value Text)
s3ObjectVersion :: CodeProperty -> Maybe (Value Text)
script :: CodeProperty -> Maybe (Value Text)
sourceLocationArn :: CodeProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
..}
    = CodeProperty {handler :: Maybe (Value Text)
handler = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Handler" CodeProperty
Value Text
newValue, Maybe [DependencyProperty]
Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
..}
instance Property "S3Bucket" CodeProperty where
  type PropertyType "S3Bucket" CodeProperty = Value Prelude.Text
  set :: PropertyType "S3Bucket" CodeProperty
-> CodeProperty -> CodeProperty
set PropertyType "S3Bucket" CodeProperty
newValue CodeProperty {Maybe [DependencyProperty]
Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: CodeProperty -> ()
blueprintTypes :: CodeProperty -> Maybe (ValueList Text)
dependencies :: CodeProperty -> Maybe [DependencyProperty]
handler :: CodeProperty -> Maybe (Value Text)
s3Bucket :: CodeProperty -> Maybe (Value Text)
s3Key :: CodeProperty -> Maybe (Value Text)
s3ObjectVersion :: CodeProperty -> Maybe (Value Text)
script :: CodeProperty -> Maybe (Value Text)
sourceLocationArn :: CodeProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
..}
    = CodeProperty {s3Bucket :: Maybe (Value Text)
s3Bucket = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "S3Bucket" CodeProperty
Value Text
newValue, Maybe [DependencyProperty]
Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
..}
instance Property "S3Key" CodeProperty where
  type PropertyType "S3Key" CodeProperty = Value Prelude.Text
  set :: PropertyType "S3Key" CodeProperty -> CodeProperty -> CodeProperty
set PropertyType "S3Key" CodeProperty
newValue CodeProperty {Maybe [DependencyProperty]
Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: CodeProperty -> ()
blueprintTypes :: CodeProperty -> Maybe (ValueList Text)
dependencies :: CodeProperty -> Maybe [DependencyProperty]
handler :: CodeProperty -> Maybe (Value Text)
s3Bucket :: CodeProperty -> Maybe (Value Text)
s3Key :: CodeProperty -> Maybe (Value Text)
s3ObjectVersion :: CodeProperty -> Maybe (Value Text)
script :: CodeProperty -> Maybe (Value Text)
sourceLocationArn :: CodeProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
..}
    = CodeProperty {s3Key :: Maybe (Value Text)
s3Key = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "S3Key" CodeProperty
Value Text
newValue, Maybe [DependencyProperty]
Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
..}
instance Property "S3ObjectVersion" CodeProperty where
  type PropertyType "S3ObjectVersion" CodeProperty = Value Prelude.Text
  set :: PropertyType "S3ObjectVersion" CodeProperty
-> CodeProperty -> CodeProperty
set PropertyType "S3ObjectVersion" CodeProperty
newValue CodeProperty {Maybe [DependencyProperty]
Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: CodeProperty -> ()
blueprintTypes :: CodeProperty -> Maybe (ValueList Text)
dependencies :: CodeProperty -> Maybe [DependencyProperty]
handler :: CodeProperty -> Maybe (Value Text)
s3Bucket :: CodeProperty -> Maybe (Value Text)
s3Key :: CodeProperty -> Maybe (Value Text)
s3ObjectVersion :: CodeProperty -> Maybe (Value Text)
script :: CodeProperty -> Maybe (Value Text)
sourceLocationArn :: CodeProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
..}
    = CodeProperty {s3ObjectVersion :: Maybe (Value Text)
s3ObjectVersion = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "S3ObjectVersion" CodeProperty
Value Text
newValue, Maybe [DependencyProperty]
Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
..}
instance Property "Script" CodeProperty where
  type PropertyType "Script" CodeProperty = Value Prelude.Text
  set :: PropertyType "Script" CodeProperty -> CodeProperty -> CodeProperty
set PropertyType "Script" CodeProperty
newValue CodeProperty {Maybe [DependencyProperty]
Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: CodeProperty -> ()
blueprintTypes :: CodeProperty -> Maybe (ValueList Text)
dependencies :: CodeProperty -> Maybe [DependencyProperty]
handler :: CodeProperty -> Maybe (Value Text)
s3Bucket :: CodeProperty -> Maybe (Value Text)
s3Key :: CodeProperty -> Maybe (Value Text)
s3ObjectVersion :: CodeProperty -> Maybe (Value Text)
script :: CodeProperty -> Maybe (Value Text)
sourceLocationArn :: CodeProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
..}
    = CodeProperty {script :: Maybe (Value Text)
script = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Script" CodeProperty
Value Text
newValue, Maybe [DependencyProperty]
Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
..}
instance Property "SourceLocationArn" CodeProperty where
  type PropertyType "SourceLocationArn" CodeProperty = Value Prelude.Text
  set :: PropertyType "SourceLocationArn" CodeProperty
-> CodeProperty -> CodeProperty
set PropertyType "SourceLocationArn" CodeProperty
newValue CodeProperty {Maybe [DependencyProperty]
Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: CodeProperty -> ()
blueprintTypes :: CodeProperty -> Maybe (ValueList Text)
dependencies :: CodeProperty -> Maybe [DependencyProperty]
handler :: CodeProperty -> Maybe (Value Text)
s3Bucket :: CodeProperty -> Maybe (Value Text)
s3Key :: CodeProperty -> Maybe (Value Text)
s3ObjectVersion :: CodeProperty -> Maybe (Value Text)
script :: CodeProperty -> Maybe (Value Text)
sourceLocationArn :: CodeProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
sourceLocationArn :: Maybe (Value Text)
..}
    = CodeProperty {sourceLocationArn :: Maybe (Value Text)
sourceLocationArn = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "SourceLocationArn" CodeProperty
Value Text
newValue, Maybe [DependencyProperty]
Maybe (ValueList Text)
Maybe (Value Text)
()
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
haddock_workaround_ :: ()
blueprintTypes :: Maybe (ValueList Text)
dependencies :: Maybe [DependencyProperty]
handler :: Maybe (Value Text)
s3Bucket :: Maybe (Value Text)
s3Key :: Maybe (Value Text)
s3ObjectVersion :: Maybe (Value Text)
script :: Maybe (Value Text)
..}