{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}

-- Derived from AWS service descriptions, licensed under Apache 2.0.

-- |
-- Module      : Amazonka.LakeFormation.Types.Resource
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
module Amazonka.LakeFormation.Types.Resource where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.LakeFormation.Types.CatalogResource
import Amazonka.LakeFormation.Types.DataCellsFilterResource
import Amazonka.LakeFormation.Types.DataLocationResource
import Amazonka.LakeFormation.Types.DatabaseResource
import Amazonka.LakeFormation.Types.LFTagKeyResource
import Amazonka.LakeFormation.Types.LFTagPolicyResource
import Amazonka.LakeFormation.Types.TableResource
import Amazonka.LakeFormation.Types.TableWithColumnsResource
import qualified Amazonka.Prelude as Prelude

-- | A structure for the resource.
--
-- /See:/ 'newResource' smart constructor.
data Resource = Resource'
  { -- | The identifier for the Data Catalog. By default, the account ID. The
    -- Data Catalog is the persistent metadata store. It contains database
    -- definitions, table definitions, and other control information to manage
    -- your Lake Formation environment.
    Resource -> Maybe CatalogResource
catalog :: Prelude.Maybe CatalogResource,
    -- | A data cell filter.
    Resource -> Maybe DataCellsFilterResource
dataCellsFilter :: Prelude.Maybe DataCellsFilterResource,
    -- | The location of an Amazon S3 path where permissions are granted or
    -- revoked.
    Resource -> Maybe DataLocationResource
dataLocation :: Prelude.Maybe DataLocationResource,
    -- | The database for the resource. Unique to the Data Catalog. A database is
    -- a set of associated table definitions organized into a logical group.
    -- You can Grant and Revoke database permissions to a principal.
    Resource -> Maybe DatabaseResource
database :: Prelude.Maybe DatabaseResource,
    -- | The LF-tag key and values attached to a resource.
    Resource -> Maybe LFTagKeyResource
lFTag :: Prelude.Maybe LFTagKeyResource,
    -- | A list of LF-tag conditions that define a resource\'s LF-tag policy.
    Resource -> Maybe LFTagPolicyResource
lFTagPolicy :: Prelude.Maybe LFTagPolicyResource,
    -- | The table for the resource. A table is a metadata definition that
    -- represents your data. You can Grant and Revoke table privileges to a
    -- principal.
    Resource -> Maybe TableResource
table :: Prelude.Maybe TableResource,
    -- | The table with columns for the resource. A principal with permissions to
    -- this resource can select metadata from the columns of a table in the
    -- Data Catalog and the underlying data in Amazon S3.
    Resource -> Maybe TableWithColumnsResource
tableWithColumns :: Prelude.Maybe TableWithColumnsResource
  }
  deriving (Resource -> Resource -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Resource -> Resource -> Bool
$c/= :: Resource -> Resource -> Bool
== :: Resource -> Resource -> Bool
$c== :: Resource -> Resource -> Bool
Prelude.Eq, ReadPrec [Resource]
ReadPrec Resource
Int -> ReadS Resource
ReadS [Resource]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [Resource]
$creadListPrec :: ReadPrec [Resource]
readPrec :: ReadPrec Resource
$creadPrec :: ReadPrec Resource
readList :: ReadS [Resource]
$creadList :: ReadS [Resource]
readsPrec :: Int -> ReadS Resource
$creadsPrec :: Int -> ReadS Resource
Prelude.Read, Int -> Resource -> ShowS
[Resource] -> ShowS
Resource -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Resource] -> ShowS
$cshowList :: [Resource] -> ShowS
show :: Resource -> String
$cshow :: Resource -> String
showsPrec :: Int -> Resource -> ShowS
$cshowsPrec :: Int -> Resource -> ShowS
Prelude.Show, forall x. Rep Resource x -> Resource
forall x. Resource -> Rep Resource x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep Resource x -> Resource
$cfrom :: forall x. Resource -> Rep Resource x
Prelude.Generic)

-- |
-- Create a value of 'Resource' with all optional fields omitted.
--
-- Use <https://hackage.haskell.org/package/generic-lens generic-lens> or <https://hackage.haskell.org/package/optics optics> to modify other optional fields.
--
-- The following record fields are available, with the corresponding lenses provided
-- for backwards compatibility:
--
-- 'catalog', 'resource_catalog' - The identifier for the Data Catalog. By default, the account ID. The
-- Data Catalog is the persistent metadata store. It contains database
-- definitions, table definitions, and other control information to manage
-- your Lake Formation environment.
--
-- 'dataCellsFilter', 'resource_dataCellsFilter' - A data cell filter.
--
-- 'dataLocation', 'resource_dataLocation' - The location of an Amazon S3 path where permissions are granted or
-- revoked.
--
-- 'database', 'resource_database' - The database for the resource. Unique to the Data Catalog. A database is
-- a set of associated table definitions organized into a logical group.
-- You can Grant and Revoke database permissions to a principal.
--
-- 'lFTag', 'resource_lFTag' - The LF-tag key and values attached to a resource.
--
-- 'lFTagPolicy', 'resource_lFTagPolicy' - A list of LF-tag conditions that define a resource\'s LF-tag policy.
--
-- 'table', 'resource_table' - The table for the resource. A table is a metadata definition that
-- represents your data. You can Grant and Revoke table privileges to a
-- principal.
--
-- 'tableWithColumns', 'resource_tableWithColumns' - The table with columns for the resource. A principal with permissions to
-- this resource can select metadata from the columns of a table in the
-- Data Catalog and the underlying data in Amazon S3.
newResource ::
  Resource
newResource :: Resource
newResource =
  Resource'
    { $sel:catalog:Resource' :: Maybe CatalogResource
catalog = forall a. Maybe a
Prelude.Nothing,
      $sel:dataCellsFilter:Resource' :: Maybe DataCellsFilterResource
dataCellsFilter = forall a. Maybe a
Prelude.Nothing,
      $sel:dataLocation:Resource' :: Maybe DataLocationResource
dataLocation = forall a. Maybe a
Prelude.Nothing,
      $sel:database:Resource' :: Maybe DatabaseResource
database = forall a. Maybe a
Prelude.Nothing,
      $sel:lFTag:Resource' :: Maybe LFTagKeyResource
lFTag = forall a. Maybe a
Prelude.Nothing,
      $sel:lFTagPolicy:Resource' :: Maybe LFTagPolicyResource
lFTagPolicy = forall a. Maybe a
Prelude.Nothing,
      $sel:table:Resource' :: Maybe TableResource
table = forall a. Maybe a
Prelude.Nothing,
      $sel:tableWithColumns:Resource' :: Maybe TableWithColumnsResource
tableWithColumns = forall a. Maybe a
Prelude.Nothing
    }

-- | The identifier for the Data Catalog. By default, the account ID. The
-- Data Catalog is the persistent metadata store. It contains database
-- definitions, table definitions, and other control information to manage
-- your Lake Formation environment.
resource_catalog :: Lens.Lens' Resource (Prelude.Maybe CatalogResource)
resource_catalog :: Lens' Resource (Maybe CatalogResource)
resource_catalog = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Resource' {Maybe CatalogResource
catalog :: Maybe CatalogResource
$sel:catalog:Resource' :: Resource -> Maybe CatalogResource
catalog} -> Maybe CatalogResource
catalog) (\s :: Resource
s@Resource' {} Maybe CatalogResource
a -> Resource
s {$sel:catalog:Resource' :: Maybe CatalogResource
catalog = Maybe CatalogResource
a} :: Resource)

-- | A data cell filter.
resource_dataCellsFilter :: Lens.Lens' Resource (Prelude.Maybe DataCellsFilterResource)
resource_dataCellsFilter :: Lens' Resource (Maybe DataCellsFilterResource)
resource_dataCellsFilter = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Resource' {Maybe DataCellsFilterResource
dataCellsFilter :: Maybe DataCellsFilterResource
$sel:dataCellsFilter:Resource' :: Resource -> Maybe DataCellsFilterResource
dataCellsFilter} -> Maybe DataCellsFilterResource
dataCellsFilter) (\s :: Resource
s@Resource' {} Maybe DataCellsFilterResource
a -> Resource
s {$sel:dataCellsFilter:Resource' :: Maybe DataCellsFilterResource
dataCellsFilter = Maybe DataCellsFilterResource
a} :: Resource)

-- | The location of an Amazon S3 path where permissions are granted or
-- revoked.
resource_dataLocation :: Lens.Lens' Resource (Prelude.Maybe DataLocationResource)
resource_dataLocation :: Lens' Resource (Maybe DataLocationResource)
resource_dataLocation = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Resource' {Maybe DataLocationResource
dataLocation :: Maybe DataLocationResource
$sel:dataLocation:Resource' :: Resource -> Maybe DataLocationResource
dataLocation} -> Maybe DataLocationResource
dataLocation) (\s :: Resource
s@Resource' {} Maybe DataLocationResource
a -> Resource
s {$sel:dataLocation:Resource' :: Maybe DataLocationResource
dataLocation = Maybe DataLocationResource
a} :: Resource)

-- | The database for the resource. Unique to the Data Catalog. A database is
-- a set of associated table definitions organized into a logical group.
-- You can Grant and Revoke database permissions to a principal.
resource_database :: Lens.Lens' Resource (Prelude.Maybe DatabaseResource)
resource_database :: Lens' Resource (Maybe DatabaseResource)
resource_database = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Resource' {Maybe DatabaseResource
database :: Maybe DatabaseResource
$sel:database:Resource' :: Resource -> Maybe DatabaseResource
database} -> Maybe DatabaseResource
database) (\s :: Resource
s@Resource' {} Maybe DatabaseResource
a -> Resource
s {$sel:database:Resource' :: Maybe DatabaseResource
database = Maybe DatabaseResource
a} :: Resource)

-- | The LF-tag key and values attached to a resource.
resource_lFTag :: Lens.Lens' Resource (Prelude.Maybe LFTagKeyResource)
resource_lFTag :: Lens' Resource (Maybe LFTagKeyResource)
resource_lFTag = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Resource' {Maybe LFTagKeyResource
lFTag :: Maybe LFTagKeyResource
$sel:lFTag:Resource' :: Resource -> Maybe LFTagKeyResource
lFTag} -> Maybe LFTagKeyResource
lFTag) (\s :: Resource
s@Resource' {} Maybe LFTagKeyResource
a -> Resource
s {$sel:lFTag:Resource' :: Maybe LFTagKeyResource
lFTag = Maybe LFTagKeyResource
a} :: Resource)

-- | A list of LF-tag conditions that define a resource\'s LF-tag policy.
resource_lFTagPolicy :: Lens.Lens' Resource (Prelude.Maybe LFTagPolicyResource)
resource_lFTagPolicy :: Lens' Resource (Maybe LFTagPolicyResource)
resource_lFTagPolicy = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Resource' {Maybe LFTagPolicyResource
lFTagPolicy :: Maybe LFTagPolicyResource
$sel:lFTagPolicy:Resource' :: Resource -> Maybe LFTagPolicyResource
lFTagPolicy} -> Maybe LFTagPolicyResource
lFTagPolicy) (\s :: Resource
s@Resource' {} Maybe LFTagPolicyResource
a -> Resource
s {$sel:lFTagPolicy:Resource' :: Maybe LFTagPolicyResource
lFTagPolicy = Maybe LFTagPolicyResource
a} :: Resource)

-- | The table for the resource. A table is a metadata definition that
-- represents your data. You can Grant and Revoke table privileges to a
-- principal.
resource_table :: Lens.Lens' Resource (Prelude.Maybe TableResource)
resource_table :: Lens' Resource (Maybe TableResource)
resource_table = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Resource' {Maybe TableResource
table :: Maybe TableResource
$sel:table:Resource' :: Resource -> Maybe TableResource
table} -> Maybe TableResource
table) (\s :: Resource
s@Resource' {} Maybe TableResource
a -> Resource
s {$sel:table:Resource' :: Maybe TableResource
table = Maybe TableResource
a} :: Resource)

-- | The table with columns for the resource. A principal with permissions to
-- this resource can select metadata from the columns of a table in the
-- Data Catalog and the underlying data in Amazon S3.
resource_tableWithColumns :: Lens.Lens' Resource (Prelude.Maybe TableWithColumnsResource)
resource_tableWithColumns :: Lens' Resource (Maybe TableWithColumnsResource)
resource_tableWithColumns = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Resource' {Maybe TableWithColumnsResource
tableWithColumns :: Maybe TableWithColumnsResource
$sel:tableWithColumns:Resource' :: Resource -> Maybe TableWithColumnsResource
tableWithColumns} -> Maybe TableWithColumnsResource
tableWithColumns) (\s :: Resource
s@Resource' {} Maybe TableWithColumnsResource
a -> Resource
s {$sel:tableWithColumns:Resource' :: Maybe TableWithColumnsResource
tableWithColumns = Maybe TableWithColumnsResource
a} :: Resource)

instance Data.FromJSON Resource where
  parseJSON :: Value -> Parser Resource
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"Resource"
      ( \Object
x ->
          Maybe CatalogResource
-> Maybe DataCellsFilterResource
-> Maybe DataLocationResource
-> Maybe DatabaseResource
-> Maybe LFTagKeyResource
-> Maybe LFTagPolicyResource
-> Maybe TableResource
-> Maybe TableWithColumnsResource
-> Resource
Resource'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"Catalog")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"DataCellsFilter")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"DataLocation")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"Database")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"LFTag")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"LFTagPolicy")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"Table")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"TableWithColumns")
      )

instance Prelude.Hashable Resource where
  hashWithSalt :: Int -> Resource -> Int
hashWithSalt Int
_salt Resource' {Maybe CatalogResource
Maybe DataCellsFilterResource
Maybe DataLocationResource
Maybe DatabaseResource
Maybe LFTagKeyResource
Maybe LFTagPolicyResource
Maybe TableResource
Maybe TableWithColumnsResource
tableWithColumns :: Maybe TableWithColumnsResource
table :: Maybe TableResource
lFTagPolicy :: Maybe LFTagPolicyResource
lFTag :: Maybe LFTagKeyResource
database :: Maybe DatabaseResource
dataLocation :: Maybe DataLocationResource
dataCellsFilter :: Maybe DataCellsFilterResource
catalog :: Maybe CatalogResource
$sel:tableWithColumns:Resource' :: Resource -> Maybe TableWithColumnsResource
$sel:table:Resource' :: Resource -> Maybe TableResource
$sel:lFTagPolicy:Resource' :: Resource -> Maybe LFTagPolicyResource
$sel:lFTag:Resource' :: Resource -> Maybe LFTagKeyResource
$sel:database:Resource' :: Resource -> Maybe DatabaseResource
$sel:dataLocation:Resource' :: Resource -> Maybe DataLocationResource
$sel:dataCellsFilter:Resource' :: Resource -> Maybe DataCellsFilterResource
$sel:catalog:Resource' :: Resource -> Maybe CatalogResource
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe CatalogResource
catalog
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe DataCellsFilterResource
dataCellsFilter
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe DataLocationResource
dataLocation
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe DatabaseResource
database
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe LFTagKeyResource
lFTag
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe LFTagPolicyResource
lFTagPolicy
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe TableResource
table
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe TableWithColumnsResource
tableWithColumns

instance Prelude.NFData Resource where
  rnf :: Resource -> ()
rnf Resource' {Maybe CatalogResource
Maybe DataCellsFilterResource
Maybe DataLocationResource
Maybe DatabaseResource
Maybe LFTagKeyResource
Maybe LFTagPolicyResource
Maybe TableResource
Maybe TableWithColumnsResource
tableWithColumns :: Maybe TableWithColumnsResource
table :: Maybe TableResource
lFTagPolicy :: Maybe LFTagPolicyResource
lFTag :: Maybe LFTagKeyResource
database :: Maybe DatabaseResource
dataLocation :: Maybe DataLocationResource
dataCellsFilter :: Maybe DataCellsFilterResource
catalog :: Maybe CatalogResource
$sel:tableWithColumns:Resource' :: Resource -> Maybe TableWithColumnsResource
$sel:table:Resource' :: Resource -> Maybe TableResource
$sel:lFTagPolicy:Resource' :: Resource -> Maybe LFTagPolicyResource
$sel:lFTag:Resource' :: Resource -> Maybe LFTagKeyResource
$sel:database:Resource' :: Resource -> Maybe DatabaseResource
$sel:dataLocation:Resource' :: Resource -> Maybe DataLocationResource
$sel:dataCellsFilter:Resource' :: Resource -> Maybe DataCellsFilterResource
$sel:catalog:Resource' :: Resource -> Maybe CatalogResource
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe CatalogResource
catalog
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe DataCellsFilterResource
dataCellsFilter
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe DataLocationResource
dataLocation
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe DatabaseResource
database
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe LFTagKeyResource
lFTag
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe LFTagPolicyResource
lFTagPolicy
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe TableResource
table
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe TableWithColumnsResource
tableWithColumns

instance Data.ToJSON Resource where
  toJSON :: Resource -> Value
toJSON Resource' {Maybe CatalogResource
Maybe DataCellsFilterResource
Maybe DataLocationResource
Maybe DatabaseResource
Maybe LFTagKeyResource
Maybe LFTagPolicyResource
Maybe TableResource
Maybe TableWithColumnsResource
tableWithColumns :: Maybe TableWithColumnsResource
table :: Maybe TableResource
lFTagPolicy :: Maybe LFTagPolicyResource
lFTag :: Maybe LFTagKeyResource
database :: Maybe DatabaseResource
dataLocation :: Maybe DataLocationResource
dataCellsFilter :: Maybe DataCellsFilterResource
catalog :: Maybe CatalogResource
$sel:tableWithColumns:Resource' :: Resource -> Maybe TableWithColumnsResource
$sel:table:Resource' :: Resource -> Maybe TableResource
$sel:lFTagPolicy:Resource' :: Resource -> Maybe LFTagPolicyResource
$sel:lFTag:Resource' :: Resource -> Maybe LFTagKeyResource
$sel:database:Resource' :: Resource -> Maybe DatabaseResource
$sel:dataLocation:Resource' :: Resource -> Maybe DataLocationResource
$sel:dataCellsFilter:Resource' :: Resource -> Maybe DataCellsFilterResource
$sel:catalog:Resource' :: Resource -> Maybe CatalogResource
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"Catalog" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CatalogResource
catalog,
            (Key
"DataCellsFilter" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DataCellsFilterResource
dataCellsFilter,
            (Key
"DataLocation" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DataLocationResource
dataLocation,
            (Key
"Database" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DatabaseResource
database,
            (Key
"LFTag" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe LFTagKeyResource
lFTag,
            (Key
"LFTagPolicy" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe LFTagPolicyResource
lFTagPolicy,
            (Key
"Table" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TableResource
table,
            (Key
"TableWithColumns" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TableWithColumnsResource
tableWithColumns
          ]
      )