module Stratosphere.AppFlow.ConnectorProfile.DatadogConnectorProfileCredentialsProperty (
        DatadogConnectorProfileCredentialsProperty(..),
        mkDatadogConnectorProfileCredentialsProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data DatadogConnectorProfileCredentialsProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-appflow-connectorprofile-datadogconnectorprofilecredentials.html>
    DatadogConnectorProfileCredentialsProperty {DatadogConnectorProfileCredentialsProperty -> ()
haddock_workaround_ :: (),
                                                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-appflow-connectorprofile-datadogconnectorprofilecredentials.html#cfn-appflow-connectorprofile-datadogconnectorprofilecredentials-apikey>
                                                DatadogConnectorProfileCredentialsProperty -> Value Text
apiKey :: (Value Prelude.Text),
                                                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-appflow-connectorprofile-datadogconnectorprofilecredentials.html#cfn-appflow-connectorprofile-datadogconnectorprofilecredentials-applicationkey>
                                                DatadogConnectorProfileCredentialsProperty -> Value Text
applicationKey :: (Value Prelude.Text)}
  deriving stock (DatadogConnectorProfileCredentialsProperty
-> DatadogConnectorProfileCredentialsProperty -> Bool
(DatadogConnectorProfileCredentialsProperty
 -> DatadogConnectorProfileCredentialsProperty -> Bool)
-> (DatadogConnectorProfileCredentialsProperty
    -> DatadogConnectorProfileCredentialsProperty -> Bool)
-> Eq DatadogConnectorProfileCredentialsProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: DatadogConnectorProfileCredentialsProperty
-> DatadogConnectorProfileCredentialsProperty -> Bool
== :: DatadogConnectorProfileCredentialsProperty
-> DatadogConnectorProfileCredentialsProperty -> Bool
$c/= :: DatadogConnectorProfileCredentialsProperty
-> DatadogConnectorProfileCredentialsProperty -> Bool
/= :: DatadogConnectorProfileCredentialsProperty
-> DatadogConnectorProfileCredentialsProperty -> Bool
Prelude.Eq, Int -> DatadogConnectorProfileCredentialsProperty -> ShowS
[DatadogConnectorProfileCredentialsProperty] -> ShowS
DatadogConnectorProfileCredentialsProperty -> String
(Int -> DatadogConnectorProfileCredentialsProperty -> ShowS)
-> (DatadogConnectorProfileCredentialsProperty -> String)
-> ([DatadogConnectorProfileCredentialsProperty] -> ShowS)
-> Show DatadogConnectorProfileCredentialsProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> DatadogConnectorProfileCredentialsProperty -> ShowS
showsPrec :: Int -> DatadogConnectorProfileCredentialsProperty -> ShowS
$cshow :: DatadogConnectorProfileCredentialsProperty -> String
show :: DatadogConnectorProfileCredentialsProperty -> String
$cshowList :: [DatadogConnectorProfileCredentialsProperty] -> ShowS
showList :: [DatadogConnectorProfileCredentialsProperty] -> ShowS
Prelude.Show)
mkDatadogConnectorProfileCredentialsProperty ::
  Value Prelude.Text
  -> Value Prelude.Text -> DatadogConnectorProfileCredentialsProperty
mkDatadogConnectorProfileCredentialsProperty :: Value Text
-> Value Text -> DatadogConnectorProfileCredentialsProperty
mkDatadogConnectorProfileCredentialsProperty Value Text
apiKey Value Text
applicationKey
  = DatadogConnectorProfileCredentialsProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), apiKey :: Value Text
apiKey = Value Text
apiKey,
       applicationKey :: Value Text
applicationKey = Value Text
applicationKey}
instance ToResourceProperties DatadogConnectorProfileCredentialsProperty where
  toResourceProperties :: DatadogConnectorProfileCredentialsProperty -> ResourceProperties
toResourceProperties
    DatadogConnectorProfileCredentialsProperty {()
Value Text
haddock_workaround_ :: DatadogConnectorProfileCredentialsProperty -> ()
apiKey :: DatadogConnectorProfileCredentialsProperty -> Value Text
applicationKey :: DatadogConnectorProfileCredentialsProperty -> Value Text
haddock_workaround_ :: ()
apiKey :: Value Text
applicationKey :: Value Text
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::AppFlow::ConnectorProfile.DatadogConnectorProfileCredentials",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Key
"ApiKey" 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
apiKey,
                       Key
"ApplicationKey" 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
applicationKey]}
instance JSON.ToJSON DatadogConnectorProfileCredentialsProperty where
  toJSON :: DatadogConnectorProfileCredentialsProperty -> Value
toJSON DatadogConnectorProfileCredentialsProperty {()
Value Text
haddock_workaround_ :: DatadogConnectorProfileCredentialsProperty -> ()
apiKey :: DatadogConnectorProfileCredentialsProperty -> Value Text
applicationKey :: DatadogConnectorProfileCredentialsProperty -> Value Text
haddock_workaround_ :: ()
apiKey :: Value Text
applicationKey :: Value Text
..}
    = [(Key, Value)] -> Value
JSON.object
        [Key
"ApiKey" 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
apiKey, Key
"ApplicationKey" 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
applicationKey]
instance Property "ApiKey" DatadogConnectorProfileCredentialsProperty where
  type PropertyType "ApiKey" DatadogConnectorProfileCredentialsProperty = Value Prelude.Text
  set :: PropertyType "ApiKey" DatadogConnectorProfileCredentialsProperty
-> DatadogConnectorProfileCredentialsProperty
-> DatadogConnectorProfileCredentialsProperty
set PropertyType "ApiKey" DatadogConnectorProfileCredentialsProperty
newValue DatadogConnectorProfileCredentialsProperty {()
Value Text
haddock_workaround_ :: DatadogConnectorProfileCredentialsProperty -> ()
apiKey :: DatadogConnectorProfileCredentialsProperty -> Value Text
applicationKey :: DatadogConnectorProfileCredentialsProperty -> Value Text
haddock_workaround_ :: ()
apiKey :: Value Text
applicationKey :: Value Text
..}
    = DatadogConnectorProfileCredentialsProperty
        {apiKey :: Value Text
apiKey = PropertyType "ApiKey" DatadogConnectorProfileCredentialsProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
applicationKey :: Value Text
haddock_workaround_ :: ()
applicationKey :: Value Text
..}
instance Property "ApplicationKey" DatadogConnectorProfileCredentialsProperty where
  type PropertyType "ApplicationKey" DatadogConnectorProfileCredentialsProperty = Value Prelude.Text
  set :: PropertyType
  "ApplicationKey" DatadogConnectorProfileCredentialsProperty
-> DatadogConnectorProfileCredentialsProperty
-> DatadogConnectorProfileCredentialsProperty
set PropertyType
  "ApplicationKey" DatadogConnectorProfileCredentialsProperty
newValue DatadogConnectorProfileCredentialsProperty {()
Value Text
haddock_workaround_ :: DatadogConnectorProfileCredentialsProperty -> ()
apiKey :: DatadogConnectorProfileCredentialsProperty -> Value Text
applicationKey :: DatadogConnectorProfileCredentialsProperty -> Value Text
haddock_workaround_ :: ()
apiKey :: Value Text
applicationKey :: Value Text
..}
    = DatadogConnectorProfileCredentialsProperty
        {applicationKey :: Value Text
applicationKey = PropertyType
  "ApplicationKey" DatadogConnectorProfileCredentialsProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
apiKey :: Value Text
haddock_workaround_ :: ()
apiKey :: Value Text
..}