module Stratosphere.QBusiness.Plugin.CustomPluginConfigurationProperty (
module Exports, CustomPluginConfigurationProperty(..),
mkCustomPluginConfigurationProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.QBusiness.Plugin.APISchemaProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data CustomPluginConfigurationProperty
=
CustomPluginConfigurationProperty {CustomPluginConfigurationProperty -> ()
haddock_workaround_ :: (),
CustomPluginConfigurationProperty -> APISchemaProperty
apiSchema :: APISchemaProperty,
CustomPluginConfigurationProperty -> Value Text
apiSchemaType :: (Value Prelude.Text),
CustomPluginConfigurationProperty -> Value Text
description :: (Value Prelude.Text)}
deriving stock (CustomPluginConfigurationProperty
-> CustomPluginConfigurationProperty -> Bool
(CustomPluginConfigurationProperty
-> CustomPluginConfigurationProperty -> Bool)
-> (CustomPluginConfigurationProperty
-> CustomPluginConfigurationProperty -> Bool)
-> Eq CustomPluginConfigurationProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: CustomPluginConfigurationProperty
-> CustomPluginConfigurationProperty -> Bool
== :: CustomPluginConfigurationProperty
-> CustomPluginConfigurationProperty -> Bool
$c/= :: CustomPluginConfigurationProperty
-> CustomPluginConfigurationProperty -> Bool
/= :: CustomPluginConfigurationProperty
-> CustomPluginConfigurationProperty -> Bool
Prelude.Eq, Int -> CustomPluginConfigurationProperty -> ShowS
[CustomPluginConfigurationProperty] -> ShowS
CustomPluginConfigurationProperty -> String
(Int -> CustomPluginConfigurationProperty -> ShowS)
-> (CustomPluginConfigurationProperty -> String)
-> ([CustomPluginConfigurationProperty] -> ShowS)
-> Show CustomPluginConfigurationProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> CustomPluginConfigurationProperty -> ShowS
showsPrec :: Int -> CustomPluginConfigurationProperty -> ShowS
$cshow :: CustomPluginConfigurationProperty -> String
show :: CustomPluginConfigurationProperty -> String
$cshowList :: [CustomPluginConfigurationProperty] -> ShowS
showList :: [CustomPluginConfigurationProperty] -> ShowS
Prelude.Show)
mkCustomPluginConfigurationProperty ::
APISchemaProperty
-> Value Prelude.Text
-> Value Prelude.Text -> CustomPluginConfigurationProperty
mkCustomPluginConfigurationProperty :: APISchemaProperty
-> Value Text -> Value Text -> CustomPluginConfigurationProperty
mkCustomPluginConfigurationProperty
APISchemaProperty
apiSchema
Value Text
apiSchemaType
Value Text
description
= CustomPluginConfigurationProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), apiSchema :: APISchemaProperty
apiSchema = APISchemaProperty
apiSchema,
apiSchemaType :: Value Text
apiSchemaType = Value Text
apiSchemaType, description :: Value Text
description = Value Text
description}
instance ToResourceProperties CustomPluginConfigurationProperty where
toResourceProperties :: CustomPluginConfigurationProperty -> ResourceProperties
toResourceProperties CustomPluginConfigurationProperty {()
Value Text
APISchemaProperty
haddock_workaround_ :: CustomPluginConfigurationProperty -> ()
apiSchema :: CustomPluginConfigurationProperty -> APISchemaProperty
apiSchemaType :: CustomPluginConfigurationProperty -> Value Text
description :: CustomPluginConfigurationProperty -> Value Text
haddock_workaround_ :: ()
apiSchema :: APISchemaProperty
apiSchemaType :: Value Text
description :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::QBusiness::Plugin.CustomPluginConfiguration",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"ApiSchema" Key -> APISchemaProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= APISchemaProperty
apiSchema,
Key
"ApiSchemaType" 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
apiSchemaType,
Key
"Description" 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
description]}
instance JSON.ToJSON CustomPluginConfigurationProperty where
toJSON :: CustomPluginConfigurationProperty -> Value
toJSON CustomPluginConfigurationProperty {()
Value Text
APISchemaProperty
haddock_workaround_ :: CustomPluginConfigurationProperty -> ()
apiSchema :: CustomPluginConfigurationProperty -> APISchemaProperty
apiSchemaType :: CustomPluginConfigurationProperty -> Value Text
description :: CustomPluginConfigurationProperty -> Value Text
haddock_workaround_ :: ()
apiSchema :: APISchemaProperty
apiSchemaType :: Value Text
description :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"ApiSchema" Key -> APISchemaProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= APISchemaProperty
apiSchema,
Key
"ApiSchemaType" 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
apiSchemaType,
Key
"Description" 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
description]
instance Property "ApiSchema" CustomPluginConfigurationProperty where
type PropertyType "ApiSchema" CustomPluginConfigurationProperty = APISchemaProperty
set :: PropertyType "ApiSchema" CustomPluginConfigurationProperty
-> CustomPluginConfigurationProperty
-> CustomPluginConfigurationProperty
set PropertyType "ApiSchema" CustomPluginConfigurationProperty
newValue CustomPluginConfigurationProperty {()
Value Text
APISchemaProperty
haddock_workaround_ :: CustomPluginConfigurationProperty -> ()
apiSchema :: CustomPluginConfigurationProperty -> APISchemaProperty
apiSchemaType :: CustomPluginConfigurationProperty -> Value Text
description :: CustomPluginConfigurationProperty -> Value Text
haddock_workaround_ :: ()
apiSchema :: APISchemaProperty
apiSchemaType :: Value Text
description :: Value Text
..}
= CustomPluginConfigurationProperty {apiSchema :: APISchemaProperty
apiSchema = PropertyType "ApiSchema" CustomPluginConfigurationProperty
APISchemaProperty
newValue, ()
Value Text
haddock_workaround_ :: ()
apiSchemaType :: Value Text
description :: Value Text
haddock_workaround_ :: ()
apiSchemaType :: Value Text
description :: Value Text
..}
instance Property "ApiSchemaType" CustomPluginConfigurationProperty where
type PropertyType "ApiSchemaType" CustomPluginConfigurationProperty = Value Prelude.Text
set :: PropertyType "ApiSchemaType" CustomPluginConfigurationProperty
-> CustomPluginConfigurationProperty
-> CustomPluginConfigurationProperty
set PropertyType "ApiSchemaType" CustomPluginConfigurationProperty
newValue CustomPluginConfigurationProperty {()
Value Text
APISchemaProperty
haddock_workaround_ :: CustomPluginConfigurationProperty -> ()
apiSchema :: CustomPluginConfigurationProperty -> APISchemaProperty
apiSchemaType :: CustomPluginConfigurationProperty -> Value Text
description :: CustomPluginConfigurationProperty -> Value Text
haddock_workaround_ :: ()
apiSchema :: APISchemaProperty
apiSchemaType :: Value Text
description :: Value Text
..}
= CustomPluginConfigurationProperty {apiSchemaType :: Value Text
apiSchemaType = PropertyType "ApiSchemaType" CustomPluginConfigurationProperty
Value Text
newValue, ()
Value Text
APISchemaProperty
haddock_workaround_ :: ()
apiSchema :: APISchemaProperty
description :: Value Text
haddock_workaround_ :: ()
apiSchema :: APISchemaProperty
description :: Value Text
..}
instance Property "Description" CustomPluginConfigurationProperty where
type PropertyType "Description" CustomPluginConfigurationProperty = Value Prelude.Text
set :: PropertyType "Description" CustomPluginConfigurationProperty
-> CustomPluginConfigurationProperty
-> CustomPluginConfigurationProperty
set PropertyType "Description" CustomPluginConfigurationProperty
newValue CustomPluginConfigurationProperty {()
Value Text
APISchemaProperty
haddock_workaround_ :: CustomPluginConfigurationProperty -> ()
apiSchema :: CustomPluginConfigurationProperty -> APISchemaProperty
apiSchemaType :: CustomPluginConfigurationProperty -> Value Text
description :: CustomPluginConfigurationProperty -> Value Text
haddock_workaround_ :: ()
apiSchema :: APISchemaProperty
apiSchemaType :: Value Text
description :: Value Text
..}
= CustomPluginConfigurationProperty {description :: Value Text
description = PropertyType "Description" CustomPluginConfigurationProperty
Value Text
newValue, ()
Value Text
APISchemaProperty
haddock_workaround_ :: ()
apiSchema :: APISchemaProperty
apiSchemaType :: Value Text
haddock_workaround_ :: ()
apiSchema :: APISchemaProperty
apiSchemaType :: Value Text
..}