module Stratosphere.MSK.Replicator.TopicReplicationProperty (
module Exports, TopicReplicationProperty(..),
mkTopicReplicationProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.MSK.Replicator.ReplicationStartingPositionProperty as Exports
import {-# SOURCE #-} Stratosphere.MSK.Replicator.ReplicationTopicNameConfigurationProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data TopicReplicationProperty
=
TopicReplicationProperty {TopicReplicationProperty -> ()
haddock_workaround_ :: (),
TopicReplicationProperty -> Maybe (Value Bool)
copyAccessControlListsForTopics :: (Prelude.Maybe (Value Prelude.Bool)),
TopicReplicationProperty -> Maybe (Value Bool)
copyTopicConfigurations :: (Prelude.Maybe (Value Prelude.Bool)),
TopicReplicationProperty -> Maybe (Value Bool)
detectAndCopyNewTopics :: (Prelude.Maybe (Value Prelude.Bool)),
TopicReplicationProperty
-> Maybe ReplicationStartingPositionProperty
startingPosition :: (Prelude.Maybe ReplicationStartingPositionProperty),
TopicReplicationProperty
-> Maybe ReplicationTopicNameConfigurationProperty
topicNameConfiguration :: (Prelude.Maybe ReplicationTopicNameConfigurationProperty),
TopicReplicationProperty -> Maybe (ValueList Text)
topicsToExclude :: (Prelude.Maybe (ValueList Prelude.Text)),
TopicReplicationProperty -> ValueList Text
topicsToReplicate :: (ValueList Prelude.Text)}
deriving stock (TopicReplicationProperty -> TopicReplicationProperty -> Bool
(TopicReplicationProperty -> TopicReplicationProperty -> Bool)
-> (TopicReplicationProperty -> TopicReplicationProperty -> Bool)
-> Eq TopicReplicationProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: TopicReplicationProperty -> TopicReplicationProperty -> Bool
== :: TopicReplicationProperty -> TopicReplicationProperty -> Bool
$c/= :: TopicReplicationProperty -> TopicReplicationProperty -> Bool
/= :: TopicReplicationProperty -> TopicReplicationProperty -> Bool
Prelude.Eq, Int -> TopicReplicationProperty -> ShowS
[TopicReplicationProperty] -> ShowS
TopicReplicationProperty -> String
(Int -> TopicReplicationProperty -> ShowS)
-> (TopicReplicationProperty -> String)
-> ([TopicReplicationProperty] -> ShowS)
-> Show TopicReplicationProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> TopicReplicationProperty -> ShowS
showsPrec :: Int -> TopicReplicationProperty -> ShowS
$cshow :: TopicReplicationProperty -> String
show :: TopicReplicationProperty -> String
$cshowList :: [TopicReplicationProperty] -> ShowS
showList :: [TopicReplicationProperty] -> ShowS
Prelude.Show)
mkTopicReplicationProperty ::
ValueList Prelude.Text -> TopicReplicationProperty
mkTopicReplicationProperty :: ValueList Text -> TopicReplicationProperty
mkTopicReplicationProperty ValueList Text
topicsToReplicate
= TopicReplicationProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), topicsToReplicate :: ValueList Text
topicsToReplicate = ValueList Text
topicsToReplicate,
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyAccessControlListsForTopics = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
copyTopicConfigurations :: Maybe (Value Bool)
copyTopicConfigurations = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
detectAndCopyNewTopics :: Maybe (Value Bool)
detectAndCopyNewTopics = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
startingPosition :: Maybe ReplicationStartingPositionProperty
startingPosition = Maybe ReplicationStartingPositionProperty
forall a. Maybe a
Prelude.Nothing,
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicNameConfiguration = Maybe ReplicationTopicNameConfigurationProperty
forall a. Maybe a
Prelude.Nothing,
topicsToExclude :: Maybe (ValueList Text)
topicsToExclude = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties TopicReplicationProperty where
toResourceProperties :: TopicReplicationProperty -> ResourceProperties
toResourceProperties TopicReplicationProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe ReplicationStartingPositionProperty
Maybe ReplicationTopicNameConfigurationProperty
()
ValueList Text
haddock_workaround_ :: TopicReplicationProperty -> ()
copyAccessControlListsForTopics :: TopicReplicationProperty -> Maybe (Value Bool)
copyTopicConfigurations :: TopicReplicationProperty -> Maybe (Value Bool)
detectAndCopyNewTopics :: TopicReplicationProperty -> Maybe (Value Bool)
startingPosition :: TopicReplicationProperty
-> Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: TopicReplicationProperty
-> Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: TopicReplicationProperty -> Maybe (ValueList Text)
topicsToReplicate :: TopicReplicationProperty -> ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::MSK::Replicator.TopicReplication",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
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
"TopicsToReplicate" 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..= ValueList Text
topicsToReplicate]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CopyAccessControlListsForTopics"
(Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
copyAccessControlListsForTopics,
Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CopyTopicConfigurations"
(Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
copyTopicConfigurations,
Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DetectAndCopyNewTopics"
(Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
detectAndCopyNewTopics,
Key -> ReplicationStartingPositionProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"StartingPosition" (ReplicationStartingPositionProperty -> (Key, Value))
-> Maybe ReplicationStartingPositionProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ReplicationStartingPositionProperty
startingPosition,
Key -> ReplicationTopicNameConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"TopicNameConfiguration"
(ReplicationTopicNameConfigurationProperty -> (Key, Value))
-> Maybe ReplicationTopicNameConfigurationProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ReplicationTopicNameConfigurationProperty
topicNameConfiguration,
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
"TopicsToExclude" (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)
topicsToExclude]))}
instance JSON.ToJSON TopicReplicationProperty where
toJSON :: TopicReplicationProperty -> Value
toJSON TopicReplicationProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe ReplicationStartingPositionProperty
Maybe ReplicationTopicNameConfigurationProperty
()
ValueList Text
haddock_workaround_ :: TopicReplicationProperty -> ()
copyAccessControlListsForTopics :: TopicReplicationProperty -> Maybe (Value Bool)
copyTopicConfigurations :: TopicReplicationProperty -> Maybe (Value Bool)
detectAndCopyNewTopics :: TopicReplicationProperty -> Maybe (Value Bool)
startingPosition :: TopicReplicationProperty
-> Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: TopicReplicationProperty
-> Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: TopicReplicationProperty -> Maybe (ValueList Text)
topicsToReplicate :: TopicReplicationProperty -> ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList 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
"TopicsToReplicate" 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..= ValueList Text
topicsToReplicate]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CopyAccessControlListsForTopics"
(Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
copyAccessControlListsForTopics,
Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CopyTopicConfigurations"
(Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
copyTopicConfigurations,
Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DetectAndCopyNewTopics"
(Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
detectAndCopyNewTopics,
Key -> ReplicationStartingPositionProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"StartingPosition" (ReplicationStartingPositionProperty -> (Key, Value))
-> Maybe ReplicationStartingPositionProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ReplicationStartingPositionProperty
startingPosition,
Key -> ReplicationTopicNameConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"TopicNameConfiguration"
(ReplicationTopicNameConfigurationProperty -> (Key, Value))
-> Maybe ReplicationTopicNameConfigurationProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ReplicationTopicNameConfigurationProperty
topicNameConfiguration,
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
"TopicsToExclude" (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)
topicsToExclude])))
instance Property "CopyAccessControlListsForTopics" TopicReplicationProperty where
type PropertyType "CopyAccessControlListsForTopics" TopicReplicationProperty = Value Prelude.Bool
set :: PropertyType
"CopyAccessControlListsForTopics" TopicReplicationProperty
-> TopicReplicationProperty -> TopicReplicationProperty
set PropertyType
"CopyAccessControlListsForTopics" TopicReplicationProperty
newValue TopicReplicationProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe ReplicationStartingPositionProperty
Maybe ReplicationTopicNameConfigurationProperty
()
ValueList Text
haddock_workaround_ :: TopicReplicationProperty -> ()
copyAccessControlListsForTopics :: TopicReplicationProperty -> Maybe (Value Bool)
copyTopicConfigurations :: TopicReplicationProperty -> Maybe (Value Bool)
detectAndCopyNewTopics :: TopicReplicationProperty -> Maybe (Value Bool)
startingPosition :: TopicReplicationProperty
-> Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: TopicReplicationProperty
-> Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: TopicReplicationProperty -> Maybe (ValueList Text)
topicsToReplicate :: TopicReplicationProperty -> ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
..}
= TopicReplicationProperty
{copyAccessControlListsForTopics :: Maybe (Value Bool)
copyAccessControlListsForTopics = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"CopyAccessControlListsForTopics" TopicReplicationProperty
Value Bool
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe ReplicationStartingPositionProperty
Maybe ReplicationTopicNameConfigurationProperty
()
ValueList Text
haddock_workaround_ :: ()
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
haddock_workaround_ :: ()
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
..}
instance Property "CopyTopicConfigurations" TopicReplicationProperty where
type PropertyType "CopyTopicConfigurations" TopicReplicationProperty = Value Prelude.Bool
set :: PropertyType "CopyTopicConfigurations" TopicReplicationProperty
-> TopicReplicationProperty -> TopicReplicationProperty
set PropertyType "CopyTopicConfigurations" TopicReplicationProperty
newValue TopicReplicationProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe ReplicationStartingPositionProperty
Maybe ReplicationTopicNameConfigurationProperty
()
ValueList Text
haddock_workaround_ :: TopicReplicationProperty -> ()
copyAccessControlListsForTopics :: TopicReplicationProperty -> Maybe (Value Bool)
copyTopicConfigurations :: TopicReplicationProperty -> Maybe (Value Bool)
detectAndCopyNewTopics :: TopicReplicationProperty -> Maybe (Value Bool)
startingPosition :: TopicReplicationProperty
-> Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: TopicReplicationProperty
-> Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: TopicReplicationProperty -> Maybe (ValueList Text)
topicsToReplicate :: TopicReplicationProperty -> ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
..}
= TopicReplicationProperty
{copyTopicConfigurations :: Maybe (Value Bool)
copyTopicConfigurations = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CopyTopicConfigurations" TopicReplicationProperty
Value Bool
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe ReplicationStartingPositionProperty
Maybe ReplicationTopicNameConfigurationProperty
()
ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
..}
instance Property "DetectAndCopyNewTopics" TopicReplicationProperty where
type PropertyType "DetectAndCopyNewTopics" TopicReplicationProperty = Value Prelude.Bool
set :: PropertyType "DetectAndCopyNewTopics" TopicReplicationProperty
-> TopicReplicationProperty -> TopicReplicationProperty
set PropertyType "DetectAndCopyNewTopics" TopicReplicationProperty
newValue TopicReplicationProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe ReplicationStartingPositionProperty
Maybe ReplicationTopicNameConfigurationProperty
()
ValueList Text
haddock_workaround_ :: TopicReplicationProperty -> ()
copyAccessControlListsForTopics :: TopicReplicationProperty -> Maybe (Value Bool)
copyTopicConfigurations :: TopicReplicationProperty -> Maybe (Value Bool)
detectAndCopyNewTopics :: TopicReplicationProperty -> Maybe (Value Bool)
startingPosition :: TopicReplicationProperty
-> Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: TopicReplicationProperty
-> Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: TopicReplicationProperty -> Maybe (ValueList Text)
topicsToReplicate :: TopicReplicationProperty -> ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
..}
= TopicReplicationProperty
{detectAndCopyNewTopics :: Maybe (Value Bool)
detectAndCopyNewTopics = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DetectAndCopyNewTopics" TopicReplicationProperty
Value Bool
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe ReplicationStartingPositionProperty
Maybe ReplicationTopicNameConfigurationProperty
()
ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
..}
instance Property "StartingPosition" TopicReplicationProperty where
type PropertyType "StartingPosition" TopicReplicationProperty = ReplicationStartingPositionProperty
set :: PropertyType "StartingPosition" TopicReplicationProperty
-> TopicReplicationProperty -> TopicReplicationProperty
set PropertyType "StartingPosition" TopicReplicationProperty
newValue TopicReplicationProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe ReplicationStartingPositionProperty
Maybe ReplicationTopicNameConfigurationProperty
()
ValueList Text
haddock_workaround_ :: TopicReplicationProperty -> ()
copyAccessControlListsForTopics :: TopicReplicationProperty -> Maybe (Value Bool)
copyTopicConfigurations :: TopicReplicationProperty -> Maybe (Value Bool)
detectAndCopyNewTopics :: TopicReplicationProperty -> Maybe (Value Bool)
startingPosition :: TopicReplicationProperty
-> Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: TopicReplicationProperty
-> Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: TopicReplicationProperty -> Maybe (ValueList Text)
topicsToReplicate :: TopicReplicationProperty -> ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
..}
= TopicReplicationProperty
{startingPosition :: Maybe ReplicationStartingPositionProperty
startingPosition = ReplicationStartingPositionProperty
-> Maybe ReplicationStartingPositionProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "StartingPosition" TopicReplicationProperty
ReplicationStartingPositionProperty
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe ReplicationTopicNameConfigurationProperty
()
ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
..}
instance Property "TopicNameConfiguration" TopicReplicationProperty where
type PropertyType "TopicNameConfiguration" TopicReplicationProperty = ReplicationTopicNameConfigurationProperty
set :: PropertyType "TopicNameConfiguration" TopicReplicationProperty
-> TopicReplicationProperty -> TopicReplicationProperty
set PropertyType "TopicNameConfiguration" TopicReplicationProperty
newValue TopicReplicationProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe ReplicationStartingPositionProperty
Maybe ReplicationTopicNameConfigurationProperty
()
ValueList Text
haddock_workaround_ :: TopicReplicationProperty -> ()
copyAccessControlListsForTopics :: TopicReplicationProperty -> Maybe (Value Bool)
copyTopicConfigurations :: TopicReplicationProperty -> Maybe (Value Bool)
detectAndCopyNewTopics :: TopicReplicationProperty -> Maybe (Value Bool)
startingPosition :: TopicReplicationProperty
-> Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: TopicReplicationProperty
-> Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: TopicReplicationProperty -> Maybe (ValueList Text)
topicsToReplicate :: TopicReplicationProperty -> ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
..}
= TopicReplicationProperty
{topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicNameConfiguration = ReplicationTopicNameConfigurationProperty
-> Maybe ReplicationTopicNameConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "TopicNameConfiguration" TopicReplicationProperty
ReplicationTopicNameConfigurationProperty
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe ReplicationStartingPositionProperty
()
ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
..}
instance Property "TopicsToExclude" TopicReplicationProperty where
type PropertyType "TopicsToExclude" TopicReplicationProperty = ValueList Prelude.Text
set :: PropertyType "TopicsToExclude" TopicReplicationProperty
-> TopicReplicationProperty -> TopicReplicationProperty
set PropertyType "TopicsToExclude" TopicReplicationProperty
newValue TopicReplicationProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe ReplicationStartingPositionProperty
Maybe ReplicationTopicNameConfigurationProperty
()
ValueList Text
haddock_workaround_ :: TopicReplicationProperty -> ()
copyAccessControlListsForTopics :: TopicReplicationProperty -> Maybe (Value Bool)
copyTopicConfigurations :: TopicReplicationProperty -> Maybe (Value Bool)
detectAndCopyNewTopics :: TopicReplicationProperty -> Maybe (Value Bool)
startingPosition :: TopicReplicationProperty
-> Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: TopicReplicationProperty
-> Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: TopicReplicationProperty -> Maybe (ValueList Text)
topicsToReplicate :: TopicReplicationProperty -> ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
..}
= TopicReplicationProperty
{topicsToExclude :: Maybe (ValueList Text)
topicsToExclude = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "TopicsToExclude" TopicReplicationProperty
ValueList Text
newValue, Maybe (Value Bool)
Maybe ReplicationStartingPositionProperty
Maybe ReplicationTopicNameConfigurationProperty
()
ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToReplicate :: ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToReplicate :: ValueList Text
..}
instance Property "TopicsToReplicate" TopicReplicationProperty where
type PropertyType "TopicsToReplicate" TopicReplicationProperty = ValueList Prelude.Text
set :: PropertyType "TopicsToReplicate" TopicReplicationProperty
-> TopicReplicationProperty -> TopicReplicationProperty
set PropertyType "TopicsToReplicate" TopicReplicationProperty
newValue TopicReplicationProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe ReplicationStartingPositionProperty
Maybe ReplicationTopicNameConfigurationProperty
()
ValueList Text
haddock_workaround_ :: TopicReplicationProperty -> ()
copyAccessControlListsForTopics :: TopicReplicationProperty -> Maybe (Value Bool)
copyTopicConfigurations :: TopicReplicationProperty -> Maybe (Value Bool)
detectAndCopyNewTopics :: TopicReplicationProperty -> Maybe (Value Bool)
startingPosition :: TopicReplicationProperty
-> Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: TopicReplicationProperty
-> Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: TopicReplicationProperty -> Maybe (ValueList Text)
topicsToReplicate :: TopicReplicationProperty -> ValueList Text
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
topicsToReplicate :: ValueList Text
..}
= TopicReplicationProperty {topicsToReplicate :: ValueList Text
topicsToReplicate = PropertyType "TopicsToReplicate" TopicReplicationProperty
ValueList Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe ReplicationStartingPositionProperty
Maybe ReplicationTopicNameConfigurationProperty
()
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
haddock_workaround_ :: ()
copyAccessControlListsForTopics :: Maybe (Value Bool)
copyTopicConfigurations :: Maybe (Value Bool)
detectAndCopyNewTopics :: Maybe (Value Bool)
startingPosition :: Maybe ReplicationStartingPositionProperty
topicNameConfiguration :: Maybe ReplicationTopicNameConfigurationProperty
topicsToExclude :: Maybe (ValueList Text)
..}