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