module Stratosphere.QuickSight.Dashboard (
        module Exports, Dashboard(..), mkDashboard
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.QuickSight.Dashboard.DashboardPublishOptionsProperty as Exports
import {-# SOURCE #-} Stratosphere.QuickSight.Dashboard.DashboardSourceEntityProperty as Exports
import {-# SOURCE #-} Stratosphere.QuickSight.Dashboard.DashboardVersionDefinitionProperty as Exports
import {-# SOURCE #-} Stratosphere.QuickSight.Dashboard.LinkSharingConfigurationProperty as Exports
import {-# SOURCE #-} Stratosphere.QuickSight.Dashboard.ParametersProperty as Exports
import {-# SOURCE #-} Stratosphere.QuickSight.Dashboard.ResourcePermissionProperty as Exports
import {-# SOURCE #-} Stratosphere.QuickSight.Dashboard.ValidationStrategyProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Tag
import Stratosphere.Value
data Dashboard
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-quicksight-dashboard.html>
    Dashboard {Dashboard -> ()
haddock_workaround_ :: (),
               -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-quicksight-dashboard.html#cfn-quicksight-dashboard-awsaccountid>
               Dashboard -> Value Text
awsAccountId :: (Value Prelude.Text),
               -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-quicksight-dashboard.html#cfn-quicksight-dashboard-dashboardid>
               Dashboard -> Value Text
dashboardId :: (Value Prelude.Text),
               -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-quicksight-dashboard.html#cfn-quicksight-dashboard-dashboardpublishoptions>
               Dashboard -> Maybe DashboardPublishOptionsProperty
dashboardPublishOptions :: (Prelude.Maybe DashboardPublishOptionsProperty),
               -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-quicksight-dashboard.html#cfn-quicksight-dashboard-definition>
               Dashboard -> Maybe DashboardVersionDefinitionProperty
definition :: (Prelude.Maybe DashboardVersionDefinitionProperty),
               -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-quicksight-dashboard.html#cfn-quicksight-dashboard-folderarns>
               Dashboard -> Maybe (ValueList Text)
folderArns :: (Prelude.Maybe (ValueList Prelude.Text)),
               -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-quicksight-dashboard.html#cfn-quicksight-dashboard-linkentities>
               Dashboard -> Maybe (ValueList Text)
linkEntities :: (Prelude.Maybe (ValueList Prelude.Text)),
               -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-quicksight-dashboard.html#cfn-quicksight-dashboard-linksharingconfiguration>
               Dashboard -> Maybe LinkSharingConfigurationProperty
linkSharingConfiguration :: (Prelude.Maybe LinkSharingConfigurationProperty),
               -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-quicksight-dashboard.html#cfn-quicksight-dashboard-name>
               Dashboard -> Value Text
name :: (Value Prelude.Text),
               -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-quicksight-dashboard.html#cfn-quicksight-dashboard-parameters>
               Dashboard -> Maybe ParametersProperty
parameters :: (Prelude.Maybe ParametersProperty),
               -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-quicksight-dashboard.html#cfn-quicksight-dashboard-permissions>
               Dashboard -> Maybe [ResourcePermissionProperty]
permissions :: (Prelude.Maybe [ResourcePermissionProperty]),
               -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-quicksight-dashboard.html#cfn-quicksight-dashboard-sourceentity>
               Dashboard -> Maybe DashboardSourceEntityProperty
sourceEntity :: (Prelude.Maybe DashboardSourceEntityProperty),
               -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-quicksight-dashboard.html#cfn-quicksight-dashboard-tags>
               Dashboard -> Maybe [Tag]
tags :: (Prelude.Maybe [Tag]),
               -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-quicksight-dashboard.html#cfn-quicksight-dashboard-themearn>
               Dashboard -> Maybe (Value Text)
themeArn :: (Prelude.Maybe (Value Prelude.Text)),
               -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-quicksight-dashboard.html#cfn-quicksight-dashboard-validationstrategy>
               Dashboard -> Maybe ValidationStrategyProperty
validationStrategy :: (Prelude.Maybe ValidationStrategyProperty),
               -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-quicksight-dashboard.html#cfn-quicksight-dashboard-versiondescription>
               Dashboard -> Maybe (Value Text)
versionDescription :: (Prelude.Maybe (Value Prelude.Text))}
  deriving stock (Dashboard -> Dashboard -> Bool
(Dashboard -> Dashboard -> Bool)
-> (Dashboard -> Dashboard -> Bool) -> Eq Dashboard
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Dashboard -> Dashboard -> Bool
== :: Dashboard -> Dashboard -> Bool
$c/= :: Dashboard -> Dashboard -> Bool
/= :: Dashboard -> Dashboard -> Bool
Prelude.Eq, Int -> Dashboard -> ShowS
[Dashboard] -> ShowS
Dashboard -> String
(Int -> Dashboard -> ShowS)
-> (Dashboard -> String)
-> ([Dashboard] -> ShowS)
-> Show Dashboard
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Dashboard -> ShowS
showsPrec :: Int -> Dashboard -> ShowS
$cshow :: Dashboard -> String
show :: Dashboard -> String
$cshowList :: [Dashboard] -> ShowS
showList :: [Dashboard] -> ShowS
Prelude.Show)
mkDashboard ::
  Value Prelude.Text
  -> Value Prelude.Text -> Value Prelude.Text -> Dashboard
mkDashboard :: Value Text -> Value Text -> Value Text -> Dashboard
mkDashboard Value Text
awsAccountId Value Text
dashboardId Value Text
name
  = Dashboard
      {haddock_workaround_ :: ()
haddock_workaround_ = (), awsAccountId :: Value Text
awsAccountId = Value Text
awsAccountId,
       dashboardId :: Value Text
dashboardId = Value Text
dashboardId, name :: Value Text
name = Value Text
name,
       dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
dashboardPublishOptions = Maybe DashboardPublishOptionsProperty
forall a. Maybe a
Prelude.Nothing,
       definition :: Maybe DashboardVersionDefinitionProperty
definition = Maybe DashboardVersionDefinitionProperty
forall a. Maybe a
Prelude.Nothing, folderArns :: Maybe (ValueList Text)
folderArns = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
       linkEntities :: Maybe (ValueList Text)
linkEntities = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
       linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
linkSharingConfiguration = Maybe LinkSharingConfigurationProperty
forall a. Maybe a
Prelude.Nothing,
       parameters :: Maybe ParametersProperty
parameters = Maybe ParametersProperty
forall a. Maybe a
Prelude.Nothing, permissions :: Maybe [ResourcePermissionProperty]
permissions = Maybe [ResourcePermissionProperty]
forall a. Maybe a
Prelude.Nothing,
       sourceEntity :: Maybe DashboardSourceEntityProperty
sourceEntity = Maybe DashboardSourceEntityProperty
forall a. Maybe a
Prelude.Nothing, tags :: Maybe [Tag]
tags = Maybe [Tag]
forall a. Maybe a
Prelude.Nothing,
       themeArn :: Maybe (Value Text)
themeArn = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, validationStrategy :: Maybe ValidationStrategyProperty
validationStrategy = Maybe ValidationStrategyProperty
forall a. Maybe a
Prelude.Nothing,
       versionDescription :: Maybe (Value Text)
versionDescription = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties Dashboard where
  toResourceProperties :: Dashboard -> ResourceProperties
toResourceProperties Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::QuickSight::Dashboard",
         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
"AwsAccountId" 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
awsAccountId,
                            Key
"DashboardId" 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
dashboardId, Key
"Name" 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
name]
                           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                              [Key -> DashboardPublishOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DashboardPublishOptions"
                                 (DashboardPublishOptionsProperty -> (Key, Value))
-> Maybe DashboardPublishOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DashboardPublishOptionsProperty
dashboardPublishOptions,
                               Key -> DashboardVersionDefinitionProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Definition" (DashboardVersionDefinitionProperty -> (Key, Value))
-> Maybe DashboardVersionDefinitionProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DashboardVersionDefinitionProperty
definition,
                               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
"FolderArns" (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)
folderArns,
                               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
"LinkEntities" (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)
linkEntities,
                               Key -> LinkSharingConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"LinkSharingConfiguration"
                                 (LinkSharingConfigurationProperty -> (Key, Value))
-> Maybe LinkSharingConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe LinkSharingConfigurationProperty
linkSharingConfiguration,
                               Key -> ParametersProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Parameters" (ParametersProperty -> (Key, Value))
-> Maybe ParametersProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ParametersProperty
parameters,
                               Key -> [ResourcePermissionProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Permissions" ([ResourcePermissionProperty] -> (Key, Value))
-> Maybe [ResourcePermissionProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [ResourcePermissionProperty]
permissions,
                               Key -> DashboardSourceEntityProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SourceEntity" (DashboardSourceEntityProperty -> (Key, Value))
-> Maybe DashboardSourceEntityProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DashboardSourceEntityProperty
sourceEntity,
                               Key -> [Tag] -> (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" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags,
                               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
"ThemeArn" (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)
themeArn,
                               Key -> ValidationStrategyProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ValidationStrategy" (ValidationStrategyProperty -> (Key, Value))
-> Maybe ValidationStrategyProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ValidationStrategyProperty
validationStrategy,
                               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
"VersionDescription" (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)
versionDescription]))}
instance JSON.ToJSON Dashboard where
  toJSON :: Dashboard -> Value
toJSON Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (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
"AwsAccountId" 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
awsAccountId,
               Key
"DashboardId" 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
dashboardId, Key
"Name" 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
name]
              ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                 [Key -> DashboardPublishOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DashboardPublishOptions"
                    (DashboardPublishOptionsProperty -> (Key, Value))
-> Maybe DashboardPublishOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DashboardPublishOptionsProperty
dashboardPublishOptions,
                  Key -> DashboardVersionDefinitionProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Definition" (DashboardVersionDefinitionProperty -> (Key, Value))
-> Maybe DashboardVersionDefinitionProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DashboardVersionDefinitionProperty
definition,
                  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
"FolderArns" (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)
folderArns,
                  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
"LinkEntities" (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)
linkEntities,
                  Key -> LinkSharingConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"LinkSharingConfiguration"
                    (LinkSharingConfigurationProperty -> (Key, Value))
-> Maybe LinkSharingConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe LinkSharingConfigurationProperty
linkSharingConfiguration,
                  Key -> ParametersProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Parameters" (ParametersProperty -> (Key, Value))
-> Maybe ParametersProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ParametersProperty
parameters,
                  Key -> [ResourcePermissionProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Permissions" ([ResourcePermissionProperty] -> (Key, Value))
-> Maybe [ResourcePermissionProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [ResourcePermissionProperty]
permissions,
                  Key -> DashboardSourceEntityProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SourceEntity" (DashboardSourceEntityProperty -> (Key, Value))
-> Maybe DashboardSourceEntityProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DashboardSourceEntityProperty
sourceEntity,
                  Key -> [Tag] -> (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" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags,
                  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
"ThemeArn" (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)
themeArn,
                  Key -> ValidationStrategyProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ValidationStrategy" (ValidationStrategyProperty -> (Key, Value))
-> Maybe ValidationStrategyProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ValidationStrategyProperty
validationStrategy,
                  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
"VersionDescription" (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)
versionDescription])))
instance Property "AwsAccountId" Dashboard where
  type PropertyType "AwsAccountId" Dashboard = Value Prelude.Text
  set :: PropertyType "AwsAccountId" Dashboard -> Dashboard -> Dashboard
set PropertyType "AwsAccountId" Dashboard
newValue Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
    = Dashboard {awsAccountId :: Value Text
awsAccountId = PropertyType "AwsAccountId" Dashboard
Value Text
newValue, Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: ()
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
haddock_workaround_ :: ()
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
instance Property "DashboardId" Dashboard where
  type PropertyType "DashboardId" Dashboard = Value Prelude.Text
  set :: PropertyType "DashboardId" Dashboard -> Dashboard -> Dashboard
set PropertyType "DashboardId" Dashboard
newValue Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
    = Dashboard {dashboardId :: Value Text
dashboardId = PropertyType "DashboardId" Dashboard
Value Text
newValue, Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
instance Property "DashboardPublishOptions" Dashboard where
  type PropertyType "DashboardPublishOptions" Dashboard = DashboardPublishOptionsProperty
  set :: PropertyType "DashboardPublishOptions" Dashboard
-> Dashboard -> Dashboard
set PropertyType "DashboardPublishOptions" Dashboard
newValue Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
    = Dashboard {dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
dashboardPublishOptions = DashboardPublishOptionsProperty
-> Maybe DashboardPublishOptionsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DashboardPublishOptions" Dashboard
DashboardPublishOptionsProperty
newValue, Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
instance Property "Definition" Dashboard where
  type PropertyType "Definition" Dashboard = DashboardVersionDefinitionProperty
  set :: PropertyType "Definition" Dashboard -> Dashboard -> Dashboard
set PropertyType "Definition" Dashboard
newValue Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
    = Dashboard {definition :: Maybe DashboardVersionDefinitionProperty
definition = DashboardVersionDefinitionProperty
-> Maybe DashboardVersionDefinitionProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Definition" Dashboard
DashboardVersionDefinitionProperty
newValue, Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
()
Value Text
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
instance Property "FolderArns" Dashboard where
  type PropertyType "FolderArns" Dashboard = ValueList Prelude.Text
  set :: PropertyType "FolderArns" Dashboard -> Dashboard -> Dashboard
set PropertyType "FolderArns" Dashboard
newValue Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
    = Dashboard {folderArns :: Maybe (ValueList Text)
folderArns = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "FolderArns" Dashboard
ValueList Text
newValue, Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
instance Property "LinkEntities" Dashboard where
  type PropertyType "LinkEntities" Dashboard = ValueList Prelude.Text
  set :: PropertyType "LinkEntities" Dashboard -> Dashboard -> Dashboard
set PropertyType "LinkEntities" Dashboard
newValue Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
    = Dashboard {linkEntities :: Maybe (ValueList Text)
linkEntities = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "LinkEntities" Dashboard
ValueList Text
newValue, Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
instance Property "LinkSharingConfiguration" Dashboard where
  type PropertyType "LinkSharingConfiguration" Dashboard = LinkSharingConfigurationProperty
  set :: PropertyType "LinkSharingConfiguration" Dashboard
-> Dashboard -> Dashboard
set PropertyType "LinkSharingConfiguration" Dashboard
newValue Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
    = Dashboard {linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
linkSharingConfiguration = LinkSharingConfigurationProperty
-> Maybe LinkSharingConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "LinkSharingConfiguration" Dashboard
LinkSharingConfigurationProperty
newValue, Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
instance Property "Name" Dashboard where
  type PropertyType "Name" Dashboard = Value Prelude.Text
  set :: PropertyType "Name" Dashboard -> Dashboard -> Dashboard
set PropertyType "Name" Dashboard
newValue Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..} = Dashboard {name :: Value Text
name = PropertyType "Name" Dashboard
Value Text
newValue, Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
instance Property "Parameters" Dashboard where
  type PropertyType "Parameters" Dashboard = ParametersProperty
  set :: PropertyType "Parameters" Dashboard -> Dashboard -> Dashboard
set PropertyType "Parameters" Dashboard
newValue Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
    = Dashboard {parameters :: Maybe ParametersProperty
parameters = ParametersProperty -> Maybe ParametersProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Parameters" Dashboard
ParametersProperty
newValue, Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
instance Property "Permissions" Dashboard where
  type PropertyType "Permissions" Dashboard = [ResourcePermissionProperty]
  set :: PropertyType "Permissions" Dashboard -> Dashboard -> Dashboard
set PropertyType "Permissions" Dashboard
newValue Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
    = Dashboard {permissions :: Maybe [ResourcePermissionProperty]
permissions = [ResourcePermissionProperty] -> Maybe [ResourcePermissionProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [ResourcePermissionProperty]
PropertyType "Permissions" Dashboard
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
instance Property "SourceEntity" Dashboard where
  type PropertyType "SourceEntity" Dashboard = DashboardSourceEntityProperty
  set :: PropertyType "SourceEntity" Dashboard -> Dashboard -> Dashboard
set PropertyType "SourceEntity" Dashboard
newValue Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
    = Dashboard {sourceEntity :: Maybe DashboardSourceEntityProperty
sourceEntity = DashboardSourceEntityProperty
-> Maybe DashboardSourceEntityProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "SourceEntity" Dashboard
DashboardSourceEntityProperty
newValue, Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
instance Property "Tags" Dashboard where
  type PropertyType "Tags" Dashboard = [Tag]
  set :: PropertyType "Tags" Dashboard -> Dashboard -> Dashboard
set PropertyType "Tags" Dashboard
newValue Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
    = Dashboard {tags :: Maybe [Tag]
tags = [Tag] -> Maybe [Tag]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [Tag]
PropertyType "Tags" Dashboard
newValue, Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
instance Property "ThemeArn" Dashboard where
  type PropertyType "ThemeArn" Dashboard = Value Prelude.Text
  set :: PropertyType "ThemeArn" Dashboard -> Dashboard -> Dashboard
set PropertyType "ThemeArn" Dashboard
newValue Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
    = Dashboard {themeArn :: Maybe (Value Text)
themeArn = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ThemeArn" Dashboard
Value Text
newValue, Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
instance Property "ValidationStrategy" Dashboard where
  type PropertyType "ValidationStrategy" Dashboard = ValidationStrategyProperty
  set :: PropertyType "ValidationStrategy" Dashboard
-> Dashboard -> Dashboard
set PropertyType "ValidationStrategy" Dashboard
newValue Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
    = Dashboard {validationStrategy :: Maybe ValidationStrategyProperty
validationStrategy = ValidationStrategyProperty -> Maybe ValidationStrategyProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ValidationStrategy" Dashboard
ValidationStrategyProperty
newValue, Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
versionDescription :: Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
versionDescription :: Maybe (Value Text)
..}
instance Property "VersionDescription" Dashboard where
  type PropertyType "VersionDescription" Dashboard = Value Prelude.Text
  set :: PropertyType "VersionDescription" Dashboard
-> Dashboard -> Dashboard
set PropertyType "VersionDescription" Dashboard
newValue Dashboard {Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: Dashboard -> ()
awsAccountId :: Dashboard -> Value Text
dashboardId :: Dashboard -> Value Text
dashboardPublishOptions :: Dashboard -> Maybe DashboardPublishOptionsProperty
definition :: Dashboard -> Maybe DashboardVersionDefinitionProperty
folderArns :: Dashboard -> Maybe (ValueList Text)
linkEntities :: Dashboard -> Maybe (ValueList Text)
linkSharingConfiguration :: Dashboard -> Maybe LinkSharingConfigurationProperty
name :: Dashboard -> Value Text
parameters :: Dashboard -> Maybe ParametersProperty
permissions :: Dashboard -> Maybe [ResourcePermissionProperty]
sourceEntity :: Dashboard -> Maybe DashboardSourceEntityProperty
tags :: Dashboard -> Maybe [Tag]
themeArn :: Dashboard -> Maybe (Value Text)
validationStrategy :: Dashboard -> Maybe ValidationStrategyProperty
versionDescription :: Dashboard -> Maybe (Value Text)
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
versionDescription :: Maybe (Value Text)
..}
    = Dashboard {versionDescription :: Maybe (Value Text)
versionDescription = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "VersionDescription" Dashboard
Value Text
newValue, Maybe [Tag]
Maybe [ResourcePermissionProperty]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe DashboardSourceEntityProperty
Maybe LinkSharingConfigurationProperty
Maybe ParametersProperty
Maybe ValidationStrategyProperty
Maybe DashboardPublishOptionsProperty
Maybe DashboardVersionDefinitionProperty
()
Value Text
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
haddock_workaround_ :: ()
awsAccountId :: Value Text
dashboardId :: Value Text
dashboardPublishOptions :: Maybe DashboardPublishOptionsProperty
definition :: Maybe DashboardVersionDefinitionProperty
folderArns :: Maybe (ValueList Text)
linkEntities :: Maybe (ValueList Text)
linkSharingConfiguration :: Maybe LinkSharingConfigurationProperty
name :: Value Text
parameters :: Maybe ParametersProperty
permissions :: Maybe [ResourcePermissionProperty]
sourceEntity :: Maybe DashboardSourceEntityProperty
tags :: Maybe [Tag]
themeArn :: Maybe (Value Text)
validationStrategy :: Maybe ValidationStrategyProperty
..}