module Stratosphere.CleanRooms.Membership (
module Exports, Membership(..), mkMembership
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.CleanRooms.Membership.MembershipPaymentConfigurationProperty as Exports
import {-# SOURCE #-} Stratosphere.CleanRooms.Membership.MembershipProtectedJobResultConfigurationProperty as Exports
import {-# SOURCE #-} Stratosphere.CleanRooms.Membership.MembershipProtectedQueryResultConfigurationProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Tag
import Stratosphere.Value
data Membership
=
Membership {Membership -> ()
haddock_workaround_ :: (),
Membership -> Value Text
collaborationIdentifier :: (Value Prelude.Text),
Membership
-> Maybe MembershipProtectedJobResultConfigurationProperty
defaultJobResultConfiguration :: (Prelude.Maybe MembershipProtectedJobResultConfigurationProperty),
Membership
-> Maybe MembershipProtectedQueryResultConfigurationProperty
defaultResultConfiguration :: (Prelude.Maybe MembershipProtectedQueryResultConfigurationProperty),
Membership -> Maybe (Value Text)
jobLogStatus :: (Prelude.Maybe (Value Prelude.Text)),
Membership -> Maybe MembershipPaymentConfigurationProperty
paymentConfiguration :: (Prelude.Maybe MembershipPaymentConfigurationProperty),
Membership -> Value Text
queryLogStatus :: (Value Prelude.Text),
Membership -> Maybe [Tag]
tags :: (Prelude.Maybe [Tag])}
deriving stock (Membership -> Membership -> Bool
(Membership -> Membership -> Bool)
-> (Membership -> Membership -> Bool) -> Eq Membership
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Membership -> Membership -> Bool
== :: Membership -> Membership -> Bool
$c/= :: Membership -> Membership -> Bool
/= :: Membership -> Membership -> Bool
Prelude.Eq, Int -> Membership -> ShowS
[Membership] -> ShowS
Membership -> String
(Int -> Membership -> ShowS)
-> (Membership -> String)
-> ([Membership] -> ShowS)
-> Show Membership
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Membership -> ShowS
showsPrec :: Int -> Membership -> ShowS
$cshow :: Membership -> String
show :: Membership -> String
$cshowList :: [Membership] -> ShowS
showList :: [Membership] -> ShowS
Prelude.Show)
mkMembership ::
Value Prelude.Text -> Value Prelude.Text -> Membership
mkMembership :: Value Text -> Value Text -> Membership
mkMembership Value Text
collaborationIdentifier Value Text
queryLogStatus
= Membership
{haddock_workaround_ :: ()
haddock_workaround_ = (),
collaborationIdentifier :: Value Text
collaborationIdentifier = Value Text
collaborationIdentifier,
queryLogStatus :: Value Text
queryLogStatus = Value Text
queryLogStatus,
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultJobResultConfiguration = Maybe MembershipProtectedJobResultConfigurationProperty
forall a. Maybe a
Prelude.Nothing,
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
defaultResultConfiguration = Maybe MembershipProtectedQueryResultConfigurationProperty
forall a. Maybe a
Prelude.Nothing,
jobLogStatus :: Maybe (Value Text)
jobLogStatus = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
paymentConfiguration = Maybe MembershipPaymentConfigurationProperty
forall a. Maybe a
Prelude.Nothing, tags :: Maybe [Tag]
tags = Maybe [Tag]
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties Membership where
toResourceProperties :: Membership -> ResourceProperties
toResourceProperties Membership {Maybe [Tag]
Maybe (Value Text)
Maybe MembershipPaymentConfigurationProperty
Maybe MembershipProtectedJobResultConfigurationProperty
Maybe MembershipProtectedQueryResultConfigurationProperty
()
Value Text
haddock_workaround_ :: Membership -> ()
collaborationIdentifier :: Membership -> Value Text
defaultJobResultConfiguration :: Membership
-> Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Membership
-> Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Membership -> Maybe (Value Text)
paymentConfiguration :: Membership -> Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Membership -> Value Text
tags :: Membership -> Maybe [Tag]
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::CleanRooms::Membership",
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
"CollaborationIdentifier" 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
collaborationIdentifier,
Key
"QueryLogStatus" 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
queryLogStatus]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key
-> MembershipProtectedJobResultConfigurationProperty
-> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DefaultJobResultConfiguration"
(MembershipProtectedJobResultConfigurationProperty -> (Key, Value))
-> Maybe MembershipProtectedJobResultConfigurationProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MembershipProtectedJobResultConfigurationProperty
defaultJobResultConfiguration,
Key
-> MembershipProtectedQueryResultConfigurationProperty
-> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DefaultResultConfiguration"
(MembershipProtectedQueryResultConfigurationProperty
-> (Key, Value))
-> Maybe MembershipProtectedQueryResultConfigurationProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MembershipProtectedQueryResultConfigurationProperty
defaultResultConfiguration,
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
"JobLogStatus" (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)
jobLogStatus,
Key -> MembershipPaymentConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"PaymentConfiguration" (MembershipPaymentConfigurationProperty -> (Key, Value))
-> Maybe MembershipPaymentConfigurationProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MembershipPaymentConfigurationProperty
paymentConfiguration,
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]))}
instance JSON.ToJSON Membership where
toJSON :: Membership -> Value
toJSON Membership {Maybe [Tag]
Maybe (Value Text)
Maybe MembershipPaymentConfigurationProperty
Maybe MembershipProtectedJobResultConfigurationProperty
Maybe MembershipProtectedQueryResultConfigurationProperty
()
Value Text
haddock_workaround_ :: Membership -> ()
collaborationIdentifier :: Membership -> Value Text
defaultJobResultConfiguration :: Membership
-> Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Membership
-> Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Membership -> Maybe (Value Text)
paymentConfiguration :: Membership -> Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Membership -> Value Text
tags :: Membership -> Maybe [Tag]
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
..}
= [(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
"CollaborationIdentifier" 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
collaborationIdentifier,
Key
"QueryLogStatus" 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
queryLogStatus]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key
-> MembershipProtectedJobResultConfigurationProperty
-> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DefaultJobResultConfiguration"
(MembershipProtectedJobResultConfigurationProperty -> (Key, Value))
-> Maybe MembershipProtectedJobResultConfigurationProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MembershipProtectedJobResultConfigurationProperty
defaultJobResultConfiguration,
Key
-> MembershipProtectedQueryResultConfigurationProperty
-> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DefaultResultConfiguration"
(MembershipProtectedQueryResultConfigurationProperty
-> (Key, Value))
-> Maybe MembershipProtectedQueryResultConfigurationProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MembershipProtectedQueryResultConfigurationProperty
defaultResultConfiguration,
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
"JobLogStatus" (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)
jobLogStatus,
Key -> MembershipPaymentConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"PaymentConfiguration" (MembershipPaymentConfigurationProperty -> (Key, Value))
-> Maybe MembershipPaymentConfigurationProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MembershipPaymentConfigurationProperty
paymentConfiguration,
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])))
instance Property "CollaborationIdentifier" Membership where
type PropertyType "CollaborationIdentifier" Membership = Value Prelude.Text
set :: PropertyType "CollaborationIdentifier" Membership
-> Membership -> Membership
set PropertyType "CollaborationIdentifier" Membership
newValue Membership {Maybe [Tag]
Maybe (Value Text)
Maybe MembershipPaymentConfigurationProperty
Maybe MembershipProtectedJobResultConfigurationProperty
Maybe MembershipProtectedQueryResultConfigurationProperty
()
Value Text
haddock_workaround_ :: Membership -> ()
collaborationIdentifier :: Membership -> Value Text
defaultJobResultConfiguration :: Membership
-> Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Membership
-> Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Membership -> Maybe (Value Text)
paymentConfiguration :: Membership -> Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Membership -> Value Text
tags :: Membership -> Maybe [Tag]
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
..}
= Membership {collaborationIdentifier :: Value Text
collaborationIdentifier = PropertyType "CollaborationIdentifier" Membership
Value Text
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe MembershipPaymentConfigurationProperty
Maybe MembershipProtectedJobResultConfigurationProperty
Maybe MembershipProtectedQueryResultConfigurationProperty
()
Value Text
haddock_workaround_ :: ()
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
haddock_workaround_ :: ()
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
..}
instance Property "DefaultJobResultConfiguration" Membership where
type PropertyType "DefaultJobResultConfiguration" Membership = MembershipProtectedJobResultConfigurationProperty
set :: PropertyType "DefaultJobResultConfiguration" Membership
-> Membership -> Membership
set PropertyType "DefaultJobResultConfiguration" Membership
newValue Membership {Maybe [Tag]
Maybe (Value Text)
Maybe MembershipPaymentConfigurationProperty
Maybe MembershipProtectedJobResultConfigurationProperty
Maybe MembershipProtectedQueryResultConfigurationProperty
()
Value Text
haddock_workaround_ :: Membership -> ()
collaborationIdentifier :: Membership -> Value Text
defaultJobResultConfiguration :: Membership
-> Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Membership
-> Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Membership -> Maybe (Value Text)
paymentConfiguration :: Membership -> Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Membership -> Value Text
tags :: Membership -> Maybe [Tag]
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
..}
= Membership
{defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultJobResultConfiguration = MembershipProtectedJobResultConfigurationProperty
-> Maybe MembershipProtectedJobResultConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DefaultJobResultConfiguration" Membership
MembershipProtectedJobResultConfigurationProperty
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe MembershipPaymentConfigurationProperty
Maybe MembershipProtectedQueryResultConfigurationProperty
()
Value Text
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
..}
instance Property "DefaultResultConfiguration" Membership where
type PropertyType "DefaultResultConfiguration" Membership = MembershipProtectedQueryResultConfigurationProperty
set :: PropertyType "DefaultResultConfiguration" Membership
-> Membership -> Membership
set PropertyType "DefaultResultConfiguration" Membership
newValue Membership {Maybe [Tag]
Maybe (Value Text)
Maybe MembershipPaymentConfigurationProperty
Maybe MembershipProtectedJobResultConfigurationProperty
Maybe MembershipProtectedQueryResultConfigurationProperty
()
Value Text
haddock_workaround_ :: Membership -> ()
collaborationIdentifier :: Membership -> Value Text
defaultJobResultConfiguration :: Membership
-> Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Membership
-> Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Membership -> Maybe (Value Text)
paymentConfiguration :: Membership -> Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Membership -> Value Text
tags :: Membership -> Maybe [Tag]
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
..}
= Membership
{defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
defaultResultConfiguration = MembershipProtectedQueryResultConfigurationProperty
-> Maybe MembershipProtectedQueryResultConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DefaultResultConfiguration" Membership
MembershipProtectedQueryResultConfigurationProperty
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe MembershipPaymentConfigurationProperty
Maybe MembershipProtectedJobResultConfigurationProperty
()
Value Text
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
..}
instance Property "JobLogStatus" Membership where
type PropertyType "JobLogStatus" Membership = Value Prelude.Text
set :: PropertyType "JobLogStatus" Membership -> Membership -> Membership
set PropertyType "JobLogStatus" Membership
newValue Membership {Maybe [Tag]
Maybe (Value Text)
Maybe MembershipPaymentConfigurationProperty
Maybe MembershipProtectedJobResultConfigurationProperty
Maybe MembershipProtectedQueryResultConfigurationProperty
()
Value Text
haddock_workaround_ :: Membership -> ()
collaborationIdentifier :: Membership -> Value Text
defaultJobResultConfiguration :: Membership
-> Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Membership
-> Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Membership -> Maybe (Value Text)
paymentConfiguration :: Membership -> Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Membership -> Value Text
tags :: Membership -> Maybe [Tag]
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
..}
= Membership {jobLogStatus :: Maybe (Value Text)
jobLogStatus = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "JobLogStatus" Membership
Value Text
newValue, Maybe [Tag]
Maybe MembershipPaymentConfigurationProperty
Maybe MembershipProtectedJobResultConfigurationProperty
Maybe MembershipProtectedQueryResultConfigurationProperty
()
Value Text
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
..}
instance Property "PaymentConfiguration" Membership where
type PropertyType "PaymentConfiguration" Membership = MembershipPaymentConfigurationProperty
set :: PropertyType "PaymentConfiguration" Membership
-> Membership -> Membership
set PropertyType "PaymentConfiguration" Membership
newValue Membership {Maybe [Tag]
Maybe (Value Text)
Maybe MembershipPaymentConfigurationProperty
Maybe MembershipProtectedJobResultConfigurationProperty
Maybe MembershipProtectedQueryResultConfigurationProperty
()
Value Text
haddock_workaround_ :: Membership -> ()
collaborationIdentifier :: Membership -> Value Text
defaultJobResultConfiguration :: Membership
-> Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Membership
-> Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Membership -> Maybe (Value Text)
paymentConfiguration :: Membership -> Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Membership -> Value Text
tags :: Membership -> Maybe [Tag]
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
..}
= Membership {paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
paymentConfiguration = MembershipPaymentConfigurationProperty
-> Maybe MembershipPaymentConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "PaymentConfiguration" Membership
MembershipPaymentConfigurationProperty
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe MembershipProtectedJobResultConfigurationProperty
Maybe MembershipProtectedQueryResultConfigurationProperty
()
Value Text
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
queryLogStatus :: Value Text
tags :: Maybe [Tag]
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
queryLogStatus :: Value Text
tags :: Maybe [Tag]
..}
instance Property "QueryLogStatus" Membership where
type PropertyType "QueryLogStatus" Membership = Value Prelude.Text
set :: PropertyType "QueryLogStatus" Membership
-> Membership -> Membership
set PropertyType "QueryLogStatus" Membership
newValue Membership {Maybe [Tag]
Maybe (Value Text)
Maybe MembershipPaymentConfigurationProperty
Maybe MembershipProtectedJobResultConfigurationProperty
Maybe MembershipProtectedQueryResultConfigurationProperty
()
Value Text
haddock_workaround_ :: Membership -> ()
collaborationIdentifier :: Membership -> Value Text
defaultJobResultConfiguration :: Membership
-> Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Membership
-> Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Membership -> Maybe (Value Text)
paymentConfiguration :: Membership -> Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Membership -> Value Text
tags :: Membership -> Maybe [Tag]
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
..}
= Membership {queryLogStatus :: Value Text
queryLogStatus = PropertyType "QueryLogStatus" Membership
Value Text
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe MembershipPaymentConfigurationProperty
Maybe MembershipProtectedJobResultConfigurationProperty
Maybe MembershipProtectedQueryResultConfigurationProperty
()
Value Text
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
tags :: Maybe [Tag]
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
tags :: Maybe [Tag]
..}
instance Property "Tags" Membership where
type PropertyType "Tags" Membership = [Tag]
set :: PropertyType "Tags" Membership -> Membership -> Membership
set PropertyType "Tags" Membership
newValue Membership {Maybe [Tag]
Maybe (Value Text)
Maybe MembershipPaymentConfigurationProperty
Maybe MembershipProtectedJobResultConfigurationProperty
Maybe MembershipProtectedQueryResultConfigurationProperty
()
Value Text
haddock_workaround_ :: Membership -> ()
collaborationIdentifier :: Membership -> Value Text
defaultJobResultConfiguration :: Membership
-> Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Membership
-> Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Membership -> Maybe (Value Text)
paymentConfiguration :: Membership -> Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Membership -> Value Text
tags :: Membership -> Maybe [Tag]
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
tags :: Maybe [Tag]
..}
= Membership {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" Membership
newValue, Maybe (Value Text)
Maybe MembershipPaymentConfigurationProperty
Maybe MembershipProtectedJobResultConfigurationProperty
Maybe MembershipProtectedQueryResultConfigurationProperty
()
Value Text
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
haddock_workaround_ :: ()
collaborationIdentifier :: Value Text
defaultJobResultConfiguration :: Maybe MembershipProtectedJobResultConfigurationProperty
defaultResultConfiguration :: Maybe MembershipProtectedQueryResultConfigurationProperty
jobLogStatus :: Maybe (Value Text)
paymentConfiguration :: Maybe MembershipPaymentConfigurationProperty
queryLogStatus :: Value Text
..}