module Stratosphere.IoTTwinMaker.ComponentType (
module Exports, ComponentType(..), mkComponentType
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.IoTTwinMaker.ComponentType.CompositeComponentTypeProperty as Exports
import {-# SOURCE #-} Stratosphere.IoTTwinMaker.ComponentType.FunctionProperty as Exports
import {-# SOURCE #-} Stratosphere.IoTTwinMaker.ComponentType.PropertyDefinitionProperty as Exports
import {-# SOURCE #-} Stratosphere.IoTTwinMaker.ComponentType.PropertyGroupProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data ComponentType
=
ComponentType {ComponentType -> ()
haddock_workaround_ :: (),
ComponentType -> Value Text
componentTypeId :: (Value Prelude.Text),
ComponentType -> Maybe (Map Text CompositeComponentTypeProperty)
compositeComponentTypes :: (Prelude.Maybe (Prelude.Map Prelude.Text CompositeComponentTypeProperty)),
ComponentType -> Maybe (Value Text)
description :: (Prelude.Maybe (Value Prelude.Text)),
ComponentType -> Maybe (ValueList Text)
extendsFrom :: (Prelude.Maybe (ValueList Prelude.Text)),
ComponentType -> Maybe (Map Text FunctionProperty)
functions :: (Prelude.Maybe (Prelude.Map Prelude.Text FunctionProperty)),
ComponentType -> Maybe (Value Bool)
isSingleton :: (Prelude.Maybe (Value Prelude.Bool)),
ComponentType -> Maybe (Map Text PropertyDefinitionProperty)
propertyDefinitions :: (Prelude.Maybe (Prelude.Map Prelude.Text PropertyDefinitionProperty)),
ComponentType -> Maybe (Map Text PropertyGroupProperty)
propertyGroups :: (Prelude.Maybe (Prelude.Map Prelude.Text PropertyGroupProperty)),
ComponentType -> Maybe (Map Text (Value Text))
tags :: (Prelude.Maybe (Prelude.Map Prelude.Text (Value Prelude.Text))),
ComponentType -> Value Text
workspaceId :: (Value Prelude.Text)}
deriving stock (ComponentType -> ComponentType -> Bool
(ComponentType -> ComponentType -> Bool)
-> (ComponentType -> ComponentType -> Bool) -> Eq ComponentType
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ComponentType -> ComponentType -> Bool
== :: ComponentType -> ComponentType -> Bool
$c/= :: ComponentType -> ComponentType -> Bool
/= :: ComponentType -> ComponentType -> Bool
Prelude.Eq, Int -> ComponentType -> ShowS
[ComponentType] -> ShowS
ComponentType -> String
(Int -> ComponentType -> ShowS)
-> (ComponentType -> String)
-> ([ComponentType] -> ShowS)
-> Show ComponentType
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ComponentType -> ShowS
showsPrec :: Int -> ComponentType -> ShowS
$cshow :: ComponentType -> String
show :: ComponentType -> String
$cshowList :: [ComponentType] -> ShowS
showList :: [ComponentType] -> ShowS
Prelude.Show)
mkComponentType ::
Value Prelude.Text -> Value Prelude.Text -> ComponentType
mkComponentType :: Value Text -> Value Text -> ComponentType
mkComponentType Value Text
componentTypeId Value Text
workspaceId
= ComponentType
{haddock_workaround_ :: ()
haddock_workaround_ = (), componentTypeId :: Value Text
componentTypeId = Value Text
componentTypeId,
workspaceId :: Value Text
workspaceId = Value Text
workspaceId,
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
compositeComponentTypes = Maybe (Map Text CompositeComponentTypeProperty)
forall a. Maybe a
Prelude.Nothing,
description :: Maybe (Value Text)
description = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, extendsFrom :: Maybe (ValueList Text)
extendsFrom = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
functions :: Maybe (Map Text FunctionProperty)
functions = Maybe (Map Text FunctionProperty)
forall a. Maybe a
Prelude.Nothing, isSingleton :: Maybe (Value Bool)
isSingleton = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyDefinitions = Maybe (Map Text PropertyDefinitionProperty)
forall a. Maybe a
Prelude.Nothing,
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
propertyGroups = Maybe (Map Text PropertyGroupProperty)
forall a. Maybe a
Prelude.Nothing, tags :: Maybe (Map Text (Value Text))
tags = Maybe (Map Text (Value Text))
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties ComponentType where
toResourceProperties :: ComponentType -> ResourceProperties
toResourceProperties ComponentType {Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ComponentType -> ()
componentTypeId :: ComponentType -> Value Text
compositeComponentTypes :: ComponentType -> Maybe (Map Text CompositeComponentTypeProperty)
description :: ComponentType -> Maybe (Value Text)
extendsFrom :: ComponentType -> Maybe (ValueList Text)
functions :: ComponentType -> Maybe (Map Text FunctionProperty)
isSingleton :: ComponentType -> Maybe (Value Bool)
propertyDefinitions :: ComponentType -> Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: ComponentType -> Maybe (Map Text PropertyGroupProperty)
tags :: ComponentType -> Maybe (Map Text (Value Text))
workspaceId :: ComponentType -> Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::IoTTwinMaker::ComponentType",
supportsTags :: Bool
supportsTags = Bool
Prelude.True,
properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
[Key
"ComponentTypeId" 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
componentTypeId,
Key
"WorkspaceId" 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
workspaceId]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> Map Text CompositeComponentTypeProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CompositeComponentTypes"
(Map Text CompositeComponentTypeProperty -> (Key, Value))
-> Maybe (Map Text CompositeComponentTypeProperty)
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text CompositeComponentTypeProperty)
compositeComponentTypes,
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
"Description" (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)
description,
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
"ExtendsFrom" (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)
extendsFrom,
Key -> Map Text FunctionProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Functions" (Map Text FunctionProperty -> (Key, Value))
-> Maybe (Map Text FunctionProperty) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text FunctionProperty)
functions,
Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IsSingleton" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
isSingleton,
Key -> Map Text PropertyDefinitionProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"PropertyDefinitions" (Map Text PropertyDefinitionProperty -> (Key, Value))
-> Maybe (Map Text PropertyDefinitionProperty)
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text PropertyDefinitionProperty)
propertyDefinitions,
Key -> Map Text PropertyGroupProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"PropertyGroups" (Map Text PropertyGroupProperty -> (Key, Value))
-> Maybe (Map Text PropertyGroupProperty) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text PropertyGroupProperty)
propertyGroups,
Key -> Map Text (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
"Tags" (Map Text (Value Text) -> (Key, Value))
-> Maybe (Map Text (Value Text)) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text (Value Text))
tags]))}
instance JSON.ToJSON ComponentType where
toJSON :: ComponentType -> Value
toJSON ComponentType {Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ComponentType -> ()
componentTypeId :: ComponentType -> Value Text
compositeComponentTypes :: ComponentType -> Maybe (Map Text CompositeComponentTypeProperty)
description :: ComponentType -> Maybe (Value Text)
extendsFrom :: ComponentType -> Maybe (ValueList Text)
functions :: ComponentType -> Maybe (Map Text FunctionProperty)
isSingleton :: ComponentType -> Maybe (Value Bool)
propertyDefinitions :: ComponentType -> Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: ComponentType -> Maybe (Map Text PropertyGroupProperty)
tags :: ComponentType -> Maybe (Map Text (Value Text))
workspaceId :: ComponentType -> Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object
([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
[Key
"ComponentTypeId" 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
componentTypeId,
Key
"WorkspaceId" 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
workspaceId]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> Map Text CompositeComponentTypeProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CompositeComponentTypes"
(Map Text CompositeComponentTypeProperty -> (Key, Value))
-> Maybe (Map Text CompositeComponentTypeProperty)
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text CompositeComponentTypeProperty)
compositeComponentTypes,
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
"Description" (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)
description,
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
"ExtendsFrom" (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)
extendsFrom,
Key -> Map Text FunctionProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Functions" (Map Text FunctionProperty -> (Key, Value))
-> Maybe (Map Text FunctionProperty) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text FunctionProperty)
functions,
Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IsSingleton" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
isSingleton,
Key -> Map Text PropertyDefinitionProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"PropertyDefinitions" (Map Text PropertyDefinitionProperty -> (Key, Value))
-> Maybe (Map Text PropertyDefinitionProperty)
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text PropertyDefinitionProperty)
propertyDefinitions,
Key -> Map Text PropertyGroupProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"PropertyGroups" (Map Text PropertyGroupProperty -> (Key, Value))
-> Maybe (Map Text PropertyGroupProperty) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text PropertyGroupProperty)
propertyGroups,
Key -> Map Text (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
"Tags" (Map Text (Value Text) -> (Key, Value))
-> Maybe (Map Text (Value Text)) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text (Value Text))
tags])))
instance Property "ComponentTypeId" ComponentType where
type PropertyType "ComponentTypeId" ComponentType = Value Prelude.Text
set :: PropertyType "ComponentTypeId" ComponentType
-> ComponentType -> ComponentType
set PropertyType "ComponentTypeId" ComponentType
newValue ComponentType {Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ComponentType -> ()
componentTypeId :: ComponentType -> Value Text
compositeComponentTypes :: ComponentType -> Maybe (Map Text CompositeComponentTypeProperty)
description :: ComponentType -> Maybe (Value Text)
extendsFrom :: ComponentType -> Maybe (ValueList Text)
functions :: ComponentType -> Maybe (Map Text FunctionProperty)
isSingleton :: ComponentType -> Maybe (Value Bool)
propertyDefinitions :: ComponentType -> Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: ComponentType -> Maybe (Map Text PropertyGroupProperty)
tags :: ComponentType -> Maybe (Map Text (Value Text))
workspaceId :: ComponentType -> Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
= ComponentType {componentTypeId :: Value Text
componentTypeId = PropertyType "ComponentTypeId" ComponentType
Value Text
newValue, Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
haddock_workaround_ :: ()
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
instance Property "CompositeComponentTypes" ComponentType where
type PropertyType "CompositeComponentTypes" ComponentType = Prelude.Map Prelude.Text CompositeComponentTypeProperty
set :: PropertyType "CompositeComponentTypes" ComponentType
-> ComponentType -> ComponentType
set PropertyType "CompositeComponentTypes" ComponentType
newValue ComponentType {Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ComponentType -> ()
componentTypeId :: ComponentType -> Value Text
compositeComponentTypes :: ComponentType -> Maybe (Map Text CompositeComponentTypeProperty)
description :: ComponentType -> Maybe (Value Text)
extendsFrom :: ComponentType -> Maybe (ValueList Text)
functions :: ComponentType -> Maybe (Map Text FunctionProperty)
isSingleton :: ComponentType -> Maybe (Value Bool)
propertyDefinitions :: ComponentType -> Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: ComponentType -> Maybe (Map Text PropertyGroupProperty)
tags :: ComponentType -> Maybe (Map Text (Value Text))
workspaceId :: ComponentType -> Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
= ComponentType
{compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
compositeComponentTypes = Map Text CompositeComponentTypeProperty
-> Maybe (Map Text CompositeComponentTypeProperty)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure Map Text CompositeComponentTypeProperty
PropertyType "CompositeComponentTypes" ComponentType
newValue, Maybe (Map Text (Value Text))
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
instance Property "Description" ComponentType where
type PropertyType "Description" ComponentType = Value Prelude.Text
set :: PropertyType "Description" ComponentType
-> ComponentType -> ComponentType
set PropertyType "Description" ComponentType
newValue ComponentType {Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ComponentType -> ()
componentTypeId :: ComponentType -> Value Text
compositeComponentTypes :: ComponentType -> Maybe (Map Text CompositeComponentTypeProperty)
description :: ComponentType -> Maybe (Value Text)
extendsFrom :: ComponentType -> Maybe (ValueList Text)
functions :: ComponentType -> Maybe (Map Text FunctionProperty)
isSingleton :: ComponentType -> Maybe (Value Bool)
propertyDefinitions :: ComponentType -> Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: ComponentType -> Maybe (Map Text PropertyGroupProperty)
tags :: ComponentType -> Maybe (Map Text (Value Text))
workspaceId :: ComponentType -> Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
= ComponentType {description :: Maybe (Value Text)
description = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Description" ComponentType
Value Text
newValue, Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
()
Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
instance Property "ExtendsFrom" ComponentType where
type PropertyType "ExtendsFrom" ComponentType = ValueList Prelude.Text
set :: PropertyType "ExtendsFrom" ComponentType
-> ComponentType -> ComponentType
set PropertyType "ExtendsFrom" ComponentType
newValue ComponentType {Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ComponentType -> ()
componentTypeId :: ComponentType -> Value Text
compositeComponentTypes :: ComponentType -> Maybe (Map Text CompositeComponentTypeProperty)
description :: ComponentType -> Maybe (Value Text)
extendsFrom :: ComponentType -> Maybe (ValueList Text)
functions :: ComponentType -> Maybe (Map Text FunctionProperty)
isSingleton :: ComponentType -> Maybe (Value Bool)
propertyDefinitions :: ComponentType -> Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: ComponentType -> Maybe (Map Text PropertyGroupProperty)
tags :: ComponentType -> Maybe (Map Text (Value Text))
workspaceId :: ComponentType -> Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
= ComponentType {extendsFrom :: Maybe (ValueList Text)
extendsFrom = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ExtendsFrom" ComponentType
ValueList Text
newValue, Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
instance Property "Functions" ComponentType where
type PropertyType "Functions" ComponentType = Prelude.Map Prelude.Text FunctionProperty
set :: PropertyType "Functions" ComponentType
-> ComponentType -> ComponentType
set PropertyType "Functions" ComponentType
newValue ComponentType {Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ComponentType -> ()
componentTypeId :: ComponentType -> Value Text
compositeComponentTypes :: ComponentType -> Maybe (Map Text CompositeComponentTypeProperty)
description :: ComponentType -> Maybe (Value Text)
extendsFrom :: ComponentType -> Maybe (ValueList Text)
functions :: ComponentType -> Maybe (Map Text FunctionProperty)
isSingleton :: ComponentType -> Maybe (Value Bool)
propertyDefinitions :: ComponentType -> Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: ComponentType -> Maybe (Map Text PropertyGroupProperty)
tags :: ComponentType -> Maybe (Map Text (Value Text))
workspaceId :: ComponentType -> Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
= ComponentType {functions :: Maybe (Map Text FunctionProperty)
functions = Map Text FunctionProperty -> Maybe (Map Text FunctionProperty)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure Map Text FunctionProperty
PropertyType "Functions" ComponentType
newValue, Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
instance Property "IsSingleton" ComponentType where
type PropertyType "IsSingleton" ComponentType = Value Prelude.Bool
set :: PropertyType "IsSingleton" ComponentType
-> ComponentType -> ComponentType
set PropertyType "IsSingleton" ComponentType
newValue ComponentType {Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ComponentType -> ()
componentTypeId :: ComponentType -> Value Text
compositeComponentTypes :: ComponentType -> Maybe (Map Text CompositeComponentTypeProperty)
description :: ComponentType -> Maybe (Value Text)
extendsFrom :: ComponentType -> Maybe (ValueList Text)
functions :: ComponentType -> Maybe (Map Text FunctionProperty)
isSingleton :: ComponentType -> Maybe (Value Bool)
propertyDefinitions :: ComponentType -> Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: ComponentType -> Maybe (Map Text PropertyGroupProperty)
tags :: ComponentType -> Maybe (Map Text (Value Text))
workspaceId :: ComponentType -> Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
= ComponentType {isSingleton :: Maybe (Value Bool)
isSingleton = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "IsSingleton" ComponentType
Value Bool
newValue, Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
instance Property "PropertyDefinitions" ComponentType where
type PropertyType "PropertyDefinitions" ComponentType = Prelude.Map Prelude.Text PropertyDefinitionProperty
set :: PropertyType "PropertyDefinitions" ComponentType
-> ComponentType -> ComponentType
set PropertyType "PropertyDefinitions" ComponentType
newValue ComponentType {Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ComponentType -> ()
componentTypeId :: ComponentType -> Value Text
compositeComponentTypes :: ComponentType -> Maybe (Map Text CompositeComponentTypeProperty)
description :: ComponentType -> Maybe (Value Text)
extendsFrom :: ComponentType -> Maybe (ValueList Text)
functions :: ComponentType -> Maybe (Map Text FunctionProperty)
isSingleton :: ComponentType -> Maybe (Value Bool)
propertyDefinitions :: ComponentType -> Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: ComponentType -> Maybe (Map Text PropertyGroupProperty)
tags :: ComponentType -> Maybe (Map Text (Value Text))
workspaceId :: ComponentType -> Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
= ComponentType {propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyDefinitions = Map Text PropertyDefinitionProperty
-> Maybe (Map Text PropertyDefinitionProperty)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure Map Text PropertyDefinitionProperty
PropertyType "PropertyDefinitions" ComponentType
newValue, Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
instance Property "PropertyGroups" ComponentType where
type PropertyType "PropertyGroups" ComponentType = Prelude.Map Prelude.Text PropertyGroupProperty
set :: PropertyType "PropertyGroups" ComponentType
-> ComponentType -> ComponentType
set PropertyType "PropertyGroups" ComponentType
newValue ComponentType {Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ComponentType -> ()
componentTypeId :: ComponentType -> Value Text
compositeComponentTypes :: ComponentType -> Maybe (Map Text CompositeComponentTypeProperty)
description :: ComponentType -> Maybe (Value Text)
extendsFrom :: ComponentType -> Maybe (ValueList Text)
functions :: ComponentType -> Maybe (Map Text FunctionProperty)
isSingleton :: ComponentType -> Maybe (Value Bool)
propertyDefinitions :: ComponentType -> Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: ComponentType -> Maybe (Map Text PropertyGroupProperty)
tags :: ComponentType -> Maybe (Map Text (Value Text))
workspaceId :: ComponentType -> Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
= ComponentType {propertyGroups :: Maybe (Map Text PropertyGroupProperty)
propertyGroups = Map Text PropertyGroupProperty
-> Maybe (Map Text PropertyGroupProperty)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure Map Text PropertyGroupProperty
PropertyType "PropertyGroups" ComponentType
newValue, Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
instance Property "Tags" ComponentType where
type PropertyType "Tags" ComponentType = Prelude.Map Prelude.Text (Value Prelude.Text)
set :: PropertyType "Tags" ComponentType -> ComponentType -> ComponentType
set PropertyType "Tags" ComponentType
newValue ComponentType {Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ComponentType -> ()
componentTypeId :: ComponentType -> Value Text
compositeComponentTypes :: ComponentType -> Maybe (Map Text CompositeComponentTypeProperty)
description :: ComponentType -> Maybe (Value Text)
extendsFrom :: ComponentType -> Maybe (ValueList Text)
functions :: ComponentType -> Maybe (Map Text FunctionProperty)
isSingleton :: ComponentType -> Maybe (Value Bool)
propertyDefinitions :: ComponentType -> Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: ComponentType -> Maybe (Map Text PropertyGroupProperty)
tags :: ComponentType -> Maybe (Map Text (Value Text))
workspaceId :: ComponentType -> Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
= ComponentType {tags :: Maybe (Map Text (Value Text))
tags = Map Text (Value Text) -> Maybe (Map Text (Value Text))
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure Map Text (Value Text)
PropertyType "Tags" ComponentType
newValue, Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
workspaceId :: Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
workspaceId :: Value Text
..}
instance Property "WorkspaceId" ComponentType where
type PropertyType "WorkspaceId" ComponentType = Value Prelude.Text
set :: PropertyType "WorkspaceId" ComponentType
-> ComponentType -> ComponentType
set PropertyType "WorkspaceId" ComponentType
newValue ComponentType {Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ComponentType -> ()
componentTypeId :: ComponentType -> Value Text
compositeComponentTypes :: ComponentType -> Maybe (Map Text CompositeComponentTypeProperty)
description :: ComponentType -> Maybe (Value Text)
extendsFrom :: ComponentType -> Maybe (ValueList Text)
functions :: ComponentType -> Maybe (Map Text FunctionProperty)
isSingleton :: ComponentType -> Maybe (Value Bool)
propertyDefinitions :: ComponentType -> Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: ComponentType -> Maybe (Map Text PropertyGroupProperty)
tags :: ComponentType -> Maybe (Map Text (Value Text))
workspaceId :: ComponentType -> Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
workspaceId :: Value Text
..}
= ComponentType {workspaceId :: Value Text
workspaceId = PropertyType "WorkspaceId" ComponentType
Value Text
newValue, Maybe (Map Text (Value Text))
Maybe (Map Text CompositeComponentTypeProperty)
Maybe (Map Text FunctionProperty)
Maybe (Map Text PropertyGroupProperty)
Maybe (Map Text PropertyDefinitionProperty)
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
componentTypeId :: Value Text
compositeComponentTypes :: Maybe (Map Text CompositeComponentTypeProperty)
description :: Maybe (Value Text)
extendsFrom :: Maybe (ValueList Text)
functions :: Maybe (Map Text FunctionProperty)
isSingleton :: Maybe (Value Bool)
propertyDefinitions :: Maybe (Map Text PropertyDefinitionProperty)
propertyGroups :: Maybe (Map Text PropertyGroupProperty)
tags :: Maybe (Map Text (Value Text))
..}