module Stratosphere.DMS.ReplicationTask (
ReplicationTask(..), mkReplicationTask
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Tag
import Stratosphere.Value
data ReplicationTask
=
ReplicationTask {ReplicationTask -> ()
haddock_workaround_ :: (),
ReplicationTask -> Maybe (Value Text)
cdcStartPosition :: (Prelude.Maybe (Value Prelude.Text)),
ReplicationTask -> Maybe (Value Double)
cdcStartTime :: (Prelude.Maybe (Value Prelude.Double)),
ReplicationTask -> Maybe (Value Text)
cdcStopPosition :: (Prelude.Maybe (Value Prelude.Text)),
ReplicationTask -> Value Text
migrationType :: (Value Prelude.Text),
ReplicationTask -> Value Text
replicationInstanceArn :: (Value Prelude.Text),
ReplicationTask -> Maybe (Value Text)
replicationTaskIdentifier :: (Prelude.Maybe (Value Prelude.Text)),
ReplicationTask -> Maybe (Value Text)
replicationTaskSettings :: (Prelude.Maybe (Value Prelude.Text)),
ReplicationTask -> Maybe (Value Text)
resourceIdentifier :: (Prelude.Maybe (Value Prelude.Text)),
ReplicationTask -> Value Text
sourceEndpointArn :: (Value Prelude.Text),
ReplicationTask -> Value Text
tableMappings :: (Value Prelude.Text),
ReplicationTask -> Maybe [Tag]
tags :: (Prelude.Maybe [Tag]),
ReplicationTask -> Value Text
targetEndpointArn :: (Value Prelude.Text),
ReplicationTask -> Maybe (Value Text)
taskData :: (Prelude.Maybe (Value Prelude.Text))}
deriving stock (ReplicationTask -> ReplicationTask -> Bool
(ReplicationTask -> ReplicationTask -> Bool)
-> (ReplicationTask -> ReplicationTask -> Bool)
-> Eq ReplicationTask
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ReplicationTask -> ReplicationTask -> Bool
== :: ReplicationTask -> ReplicationTask -> Bool
$c/= :: ReplicationTask -> ReplicationTask -> Bool
/= :: ReplicationTask -> ReplicationTask -> Bool
Prelude.Eq, Int -> ReplicationTask -> ShowS
[ReplicationTask] -> ShowS
ReplicationTask -> String
(Int -> ReplicationTask -> ShowS)
-> (ReplicationTask -> String)
-> ([ReplicationTask] -> ShowS)
-> Show ReplicationTask
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ReplicationTask -> ShowS
showsPrec :: Int -> ReplicationTask -> ShowS
$cshow :: ReplicationTask -> String
show :: ReplicationTask -> String
$cshowList :: [ReplicationTask] -> ShowS
showList :: [ReplicationTask] -> ShowS
Prelude.Show)
mkReplicationTask ::
Value Prelude.Text
-> Value Prelude.Text
-> Value Prelude.Text
-> Value Prelude.Text -> Value Prelude.Text -> ReplicationTask
mkReplicationTask :: Value Text
-> Value Text
-> Value Text
-> Value Text
-> Value Text
-> ReplicationTask
mkReplicationTask
Value Text
migrationType
Value Text
replicationInstanceArn
Value Text
sourceEndpointArn
Value Text
tableMappings
Value Text
targetEndpointArn
= ReplicationTask
{haddock_workaround_ :: ()
haddock_workaround_ = (), migrationType :: Value Text
migrationType = Value Text
migrationType,
replicationInstanceArn :: Value Text
replicationInstanceArn = Value Text
replicationInstanceArn,
sourceEndpointArn :: Value Text
sourceEndpointArn = Value Text
sourceEndpointArn,
tableMappings :: Value Text
tableMappings = Value Text
tableMappings,
targetEndpointArn :: Value Text
targetEndpointArn = Value Text
targetEndpointArn,
cdcStartPosition :: Maybe (Value Text)
cdcStartPosition = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, cdcStartTime :: Maybe (Value Double)
cdcStartTime = Maybe (Value Double)
forall a. Maybe a
Prelude.Nothing,
cdcStopPosition :: Maybe (Value Text)
cdcStopPosition = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskIdentifier = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
replicationTaskSettings :: Maybe (Value Text)
replicationTaskSettings = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
resourceIdentifier :: Maybe (Value Text)
resourceIdentifier = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, tags :: Maybe [Tag]
tags = Maybe [Tag]
forall a. Maybe a
Prelude.Nothing,
taskData :: Maybe (Value Text)
taskData = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties ReplicationTask where
toResourceProperties :: ReplicationTask -> ResourceProperties
toResourceProperties ReplicationTask {Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ReplicationTask -> ()
cdcStartPosition :: ReplicationTask -> Maybe (Value Text)
cdcStartTime :: ReplicationTask -> Maybe (Value Double)
cdcStopPosition :: ReplicationTask -> Maybe (Value Text)
migrationType :: ReplicationTask -> Value Text
replicationInstanceArn :: ReplicationTask -> Value Text
replicationTaskIdentifier :: ReplicationTask -> Maybe (Value Text)
replicationTaskSettings :: ReplicationTask -> Maybe (Value Text)
resourceIdentifier :: ReplicationTask -> Maybe (Value Text)
sourceEndpointArn :: ReplicationTask -> Value Text
tableMappings :: ReplicationTask -> Value Text
tags :: ReplicationTask -> Maybe [Tag]
targetEndpointArn :: ReplicationTask -> Value Text
taskData :: ReplicationTask -> Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::DMS::ReplicationTask",
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
"MigrationType" 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
migrationType,
Key
"ReplicationInstanceArn" 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
replicationInstanceArn,
Key
"SourceEndpointArn" 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
sourceEndpointArn,
Key
"TableMappings" 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
tableMappings,
Key
"TargetEndpointArn" 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
targetEndpointArn]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[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
"CdcStartPosition" (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)
cdcStartPosition,
Key -> Value Double -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CdcStartTime" (Value Double -> (Key, Value))
-> Maybe (Value Double) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Double)
cdcStartTime,
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
"CdcStopPosition" (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)
cdcStopPosition,
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
"ReplicationTaskIdentifier"
(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)
replicationTaskIdentifier,
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
"ReplicationTaskSettings"
(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)
replicationTaskSettings,
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
"ResourceIdentifier" (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)
resourceIdentifier,
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
"TaskData" (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)
taskData]))}
instance JSON.ToJSON ReplicationTask where
toJSON :: ReplicationTask -> Value
toJSON ReplicationTask {Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ReplicationTask -> ()
cdcStartPosition :: ReplicationTask -> Maybe (Value Text)
cdcStartTime :: ReplicationTask -> Maybe (Value Double)
cdcStopPosition :: ReplicationTask -> Maybe (Value Text)
migrationType :: ReplicationTask -> Value Text
replicationInstanceArn :: ReplicationTask -> Value Text
replicationTaskIdentifier :: ReplicationTask -> Maybe (Value Text)
replicationTaskSettings :: ReplicationTask -> Maybe (Value Text)
resourceIdentifier :: ReplicationTask -> Maybe (Value Text)
sourceEndpointArn :: ReplicationTask -> Value Text
tableMappings :: ReplicationTask -> Value Text
tags :: ReplicationTask -> Maybe [Tag]
targetEndpointArn :: ReplicationTask -> Value Text
taskData :: ReplicationTask -> Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: 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
"MigrationType" 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
migrationType,
Key
"ReplicationInstanceArn" 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
replicationInstanceArn,
Key
"SourceEndpointArn" 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
sourceEndpointArn,
Key
"TableMappings" 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
tableMappings,
Key
"TargetEndpointArn" 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
targetEndpointArn]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[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
"CdcStartPosition" (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)
cdcStartPosition,
Key -> Value Double -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CdcStartTime" (Value Double -> (Key, Value))
-> Maybe (Value Double) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Double)
cdcStartTime,
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
"CdcStopPosition" (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)
cdcStopPosition,
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
"ReplicationTaskIdentifier"
(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)
replicationTaskIdentifier,
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
"ReplicationTaskSettings"
(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)
replicationTaskSettings,
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
"ResourceIdentifier" (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)
resourceIdentifier,
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
"TaskData" (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)
taskData])))
instance Property "CdcStartPosition" ReplicationTask where
type PropertyType "CdcStartPosition" ReplicationTask = Value Prelude.Text
set :: PropertyType "CdcStartPosition" ReplicationTask
-> ReplicationTask -> ReplicationTask
set PropertyType "CdcStartPosition" ReplicationTask
newValue ReplicationTask {Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ReplicationTask -> ()
cdcStartPosition :: ReplicationTask -> Maybe (Value Text)
cdcStartTime :: ReplicationTask -> Maybe (Value Double)
cdcStopPosition :: ReplicationTask -> Maybe (Value Text)
migrationType :: ReplicationTask -> Value Text
replicationInstanceArn :: ReplicationTask -> Value Text
replicationTaskIdentifier :: ReplicationTask -> Maybe (Value Text)
replicationTaskSettings :: ReplicationTask -> Maybe (Value Text)
resourceIdentifier :: ReplicationTask -> Maybe (Value Text)
sourceEndpointArn :: ReplicationTask -> Value Text
tableMappings :: ReplicationTask -> Value Text
tags :: ReplicationTask -> Maybe [Tag]
targetEndpointArn :: ReplicationTask -> Value Text
taskData :: ReplicationTask -> Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
= ReplicationTask {cdcStartPosition :: Maybe (Value Text)
cdcStartPosition = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CdcStartPosition" ReplicationTask
Value Text
newValue, Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
instance Property "CdcStartTime" ReplicationTask where
type PropertyType "CdcStartTime" ReplicationTask = Value Prelude.Double
set :: PropertyType "CdcStartTime" ReplicationTask
-> ReplicationTask -> ReplicationTask
set PropertyType "CdcStartTime" ReplicationTask
newValue ReplicationTask {Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ReplicationTask -> ()
cdcStartPosition :: ReplicationTask -> Maybe (Value Text)
cdcStartTime :: ReplicationTask -> Maybe (Value Double)
cdcStopPosition :: ReplicationTask -> Maybe (Value Text)
migrationType :: ReplicationTask -> Value Text
replicationInstanceArn :: ReplicationTask -> Value Text
replicationTaskIdentifier :: ReplicationTask -> Maybe (Value Text)
replicationTaskSettings :: ReplicationTask -> Maybe (Value Text)
resourceIdentifier :: ReplicationTask -> Maybe (Value Text)
sourceEndpointArn :: ReplicationTask -> Value Text
tableMappings :: ReplicationTask -> Value Text
tags :: ReplicationTask -> Maybe [Tag]
targetEndpointArn :: ReplicationTask -> Value Text
taskData :: ReplicationTask -> Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
= ReplicationTask {cdcStartTime :: Maybe (Value Double)
cdcStartTime = Value Double -> Maybe (Value Double)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CdcStartTime" ReplicationTask
Value Double
newValue, Maybe [Tag]
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
instance Property "CdcStopPosition" ReplicationTask where
type PropertyType "CdcStopPosition" ReplicationTask = Value Prelude.Text
set :: PropertyType "CdcStopPosition" ReplicationTask
-> ReplicationTask -> ReplicationTask
set PropertyType "CdcStopPosition" ReplicationTask
newValue ReplicationTask {Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ReplicationTask -> ()
cdcStartPosition :: ReplicationTask -> Maybe (Value Text)
cdcStartTime :: ReplicationTask -> Maybe (Value Double)
cdcStopPosition :: ReplicationTask -> Maybe (Value Text)
migrationType :: ReplicationTask -> Value Text
replicationInstanceArn :: ReplicationTask -> Value Text
replicationTaskIdentifier :: ReplicationTask -> Maybe (Value Text)
replicationTaskSettings :: ReplicationTask -> Maybe (Value Text)
resourceIdentifier :: ReplicationTask -> Maybe (Value Text)
sourceEndpointArn :: ReplicationTask -> Value Text
tableMappings :: ReplicationTask -> Value Text
tags :: ReplicationTask -> Maybe [Tag]
targetEndpointArn :: ReplicationTask -> Value Text
taskData :: ReplicationTask -> Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
= ReplicationTask {cdcStopPosition :: Maybe (Value Text)
cdcStopPosition = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CdcStopPosition" ReplicationTask
Value Text
newValue, Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
instance Property "MigrationType" ReplicationTask where
type PropertyType "MigrationType" ReplicationTask = Value Prelude.Text
set :: PropertyType "MigrationType" ReplicationTask
-> ReplicationTask -> ReplicationTask
set PropertyType "MigrationType" ReplicationTask
newValue ReplicationTask {Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ReplicationTask -> ()
cdcStartPosition :: ReplicationTask -> Maybe (Value Text)
cdcStartTime :: ReplicationTask -> Maybe (Value Double)
cdcStopPosition :: ReplicationTask -> Maybe (Value Text)
migrationType :: ReplicationTask -> Value Text
replicationInstanceArn :: ReplicationTask -> Value Text
replicationTaskIdentifier :: ReplicationTask -> Maybe (Value Text)
replicationTaskSettings :: ReplicationTask -> Maybe (Value Text)
resourceIdentifier :: ReplicationTask -> Maybe (Value Text)
sourceEndpointArn :: ReplicationTask -> Value Text
tableMappings :: ReplicationTask -> Value Text
tags :: ReplicationTask -> Maybe [Tag]
targetEndpointArn :: ReplicationTask -> Value Text
taskData :: ReplicationTask -> Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
= ReplicationTask {migrationType :: Value Text
migrationType = PropertyType "MigrationType" ReplicationTask
Value Text
newValue, Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
instance Property "ReplicationInstanceArn" ReplicationTask where
type PropertyType "ReplicationInstanceArn" ReplicationTask = Value Prelude.Text
set :: PropertyType "ReplicationInstanceArn" ReplicationTask
-> ReplicationTask -> ReplicationTask
set PropertyType "ReplicationInstanceArn" ReplicationTask
newValue ReplicationTask {Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ReplicationTask -> ()
cdcStartPosition :: ReplicationTask -> Maybe (Value Text)
cdcStartTime :: ReplicationTask -> Maybe (Value Double)
cdcStopPosition :: ReplicationTask -> Maybe (Value Text)
migrationType :: ReplicationTask -> Value Text
replicationInstanceArn :: ReplicationTask -> Value Text
replicationTaskIdentifier :: ReplicationTask -> Maybe (Value Text)
replicationTaskSettings :: ReplicationTask -> Maybe (Value Text)
resourceIdentifier :: ReplicationTask -> Maybe (Value Text)
sourceEndpointArn :: ReplicationTask -> Value Text
tableMappings :: ReplicationTask -> Value Text
tags :: ReplicationTask -> Maybe [Tag]
targetEndpointArn :: ReplicationTask -> Value Text
taskData :: ReplicationTask -> Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
= ReplicationTask {replicationInstanceArn :: Value Text
replicationInstanceArn = PropertyType "ReplicationInstanceArn" ReplicationTask
Value Text
newValue, Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
instance Property "ReplicationTaskIdentifier" ReplicationTask where
type PropertyType "ReplicationTaskIdentifier" ReplicationTask = Value Prelude.Text
set :: PropertyType "ReplicationTaskIdentifier" ReplicationTask
-> ReplicationTask -> ReplicationTask
set PropertyType "ReplicationTaskIdentifier" ReplicationTask
newValue ReplicationTask {Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ReplicationTask -> ()
cdcStartPosition :: ReplicationTask -> Maybe (Value Text)
cdcStartTime :: ReplicationTask -> Maybe (Value Double)
cdcStopPosition :: ReplicationTask -> Maybe (Value Text)
migrationType :: ReplicationTask -> Value Text
replicationInstanceArn :: ReplicationTask -> Value Text
replicationTaskIdentifier :: ReplicationTask -> Maybe (Value Text)
replicationTaskSettings :: ReplicationTask -> Maybe (Value Text)
resourceIdentifier :: ReplicationTask -> Maybe (Value Text)
sourceEndpointArn :: ReplicationTask -> Value Text
tableMappings :: ReplicationTask -> Value Text
tags :: ReplicationTask -> Maybe [Tag]
targetEndpointArn :: ReplicationTask -> Value Text
taskData :: ReplicationTask -> Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
= ReplicationTask
{replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskIdentifier = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ReplicationTaskIdentifier" ReplicationTask
Value Text
newValue, Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
instance Property "ReplicationTaskSettings" ReplicationTask where
type PropertyType "ReplicationTaskSettings" ReplicationTask = Value Prelude.Text
set :: PropertyType "ReplicationTaskSettings" ReplicationTask
-> ReplicationTask -> ReplicationTask
set PropertyType "ReplicationTaskSettings" ReplicationTask
newValue ReplicationTask {Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ReplicationTask -> ()
cdcStartPosition :: ReplicationTask -> Maybe (Value Text)
cdcStartTime :: ReplicationTask -> Maybe (Value Double)
cdcStopPosition :: ReplicationTask -> Maybe (Value Text)
migrationType :: ReplicationTask -> Value Text
replicationInstanceArn :: ReplicationTask -> Value Text
replicationTaskIdentifier :: ReplicationTask -> Maybe (Value Text)
replicationTaskSettings :: ReplicationTask -> Maybe (Value Text)
resourceIdentifier :: ReplicationTask -> Maybe (Value Text)
sourceEndpointArn :: ReplicationTask -> Value Text
tableMappings :: ReplicationTask -> Value Text
tags :: ReplicationTask -> Maybe [Tag]
targetEndpointArn :: ReplicationTask -> Value Text
taskData :: ReplicationTask -> Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
= ReplicationTask
{replicationTaskSettings :: Maybe (Value Text)
replicationTaskSettings = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ReplicationTaskSettings" ReplicationTask
Value Text
newValue, Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
instance Property "ResourceIdentifier" ReplicationTask where
type PropertyType "ResourceIdentifier" ReplicationTask = Value Prelude.Text
set :: PropertyType "ResourceIdentifier" ReplicationTask
-> ReplicationTask -> ReplicationTask
set PropertyType "ResourceIdentifier" ReplicationTask
newValue ReplicationTask {Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ReplicationTask -> ()
cdcStartPosition :: ReplicationTask -> Maybe (Value Text)
cdcStartTime :: ReplicationTask -> Maybe (Value Double)
cdcStopPosition :: ReplicationTask -> Maybe (Value Text)
migrationType :: ReplicationTask -> Value Text
replicationInstanceArn :: ReplicationTask -> Value Text
replicationTaskIdentifier :: ReplicationTask -> Maybe (Value Text)
replicationTaskSettings :: ReplicationTask -> Maybe (Value Text)
resourceIdentifier :: ReplicationTask -> Maybe (Value Text)
sourceEndpointArn :: ReplicationTask -> Value Text
tableMappings :: ReplicationTask -> Value Text
tags :: ReplicationTask -> Maybe [Tag]
targetEndpointArn :: ReplicationTask -> Value Text
taskData :: ReplicationTask -> Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
= ReplicationTask {resourceIdentifier :: Maybe (Value Text)
resourceIdentifier = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ResourceIdentifier" ReplicationTask
Value Text
newValue, Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
instance Property "SourceEndpointArn" ReplicationTask where
type PropertyType "SourceEndpointArn" ReplicationTask = Value Prelude.Text
set :: PropertyType "SourceEndpointArn" ReplicationTask
-> ReplicationTask -> ReplicationTask
set PropertyType "SourceEndpointArn" ReplicationTask
newValue ReplicationTask {Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ReplicationTask -> ()
cdcStartPosition :: ReplicationTask -> Maybe (Value Text)
cdcStartTime :: ReplicationTask -> Maybe (Value Double)
cdcStopPosition :: ReplicationTask -> Maybe (Value Text)
migrationType :: ReplicationTask -> Value Text
replicationInstanceArn :: ReplicationTask -> Value Text
replicationTaskIdentifier :: ReplicationTask -> Maybe (Value Text)
replicationTaskSettings :: ReplicationTask -> Maybe (Value Text)
resourceIdentifier :: ReplicationTask -> Maybe (Value Text)
sourceEndpointArn :: ReplicationTask -> Value Text
tableMappings :: ReplicationTask -> Value Text
tags :: ReplicationTask -> Maybe [Tag]
targetEndpointArn :: ReplicationTask -> Value Text
taskData :: ReplicationTask -> Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
= ReplicationTask {sourceEndpointArn :: Value Text
sourceEndpointArn = PropertyType "SourceEndpointArn" ReplicationTask
Value Text
newValue, Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
instance Property "TableMappings" ReplicationTask where
type PropertyType "TableMappings" ReplicationTask = Value Prelude.Text
set :: PropertyType "TableMappings" ReplicationTask
-> ReplicationTask -> ReplicationTask
set PropertyType "TableMappings" ReplicationTask
newValue ReplicationTask {Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ReplicationTask -> ()
cdcStartPosition :: ReplicationTask -> Maybe (Value Text)
cdcStartTime :: ReplicationTask -> Maybe (Value Double)
cdcStopPosition :: ReplicationTask -> Maybe (Value Text)
migrationType :: ReplicationTask -> Value Text
replicationInstanceArn :: ReplicationTask -> Value Text
replicationTaskIdentifier :: ReplicationTask -> Maybe (Value Text)
replicationTaskSettings :: ReplicationTask -> Maybe (Value Text)
resourceIdentifier :: ReplicationTask -> Maybe (Value Text)
sourceEndpointArn :: ReplicationTask -> Value Text
tableMappings :: ReplicationTask -> Value Text
tags :: ReplicationTask -> Maybe [Tag]
targetEndpointArn :: ReplicationTask -> Value Text
taskData :: ReplicationTask -> Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
= ReplicationTask {tableMappings :: Value Text
tableMappings = PropertyType "TableMappings" ReplicationTask
Value Text
newValue, Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
instance Property "Tags" ReplicationTask where
type PropertyType "Tags" ReplicationTask = [Tag]
set :: PropertyType "Tags" ReplicationTask
-> ReplicationTask -> ReplicationTask
set PropertyType "Tags" ReplicationTask
newValue ReplicationTask {Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ReplicationTask -> ()
cdcStartPosition :: ReplicationTask -> Maybe (Value Text)
cdcStartTime :: ReplicationTask -> Maybe (Value Double)
cdcStopPosition :: ReplicationTask -> Maybe (Value Text)
migrationType :: ReplicationTask -> Value Text
replicationInstanceArn :: ReplicationTask -> Value Text
replicationTaskIdentifier :: ReplicationTask -> Maybe (Value Text)
replicationTaskSettings :: ReplicationTask -> Maybe (Value Text)
resourceIdentifier :: ReplicationTask -> Maybe (Value Text)
sourceEndpointArn :: ReplicationTask -> Value Text
tableMappings :: ReplicationTask -> Value Text
tags :: ReplicationTask -> Maybe [Tag]
targetEndpointArn :: ReplicationTask -> Value Text
taskData :: ReplicationTask -> Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
= ReplicationTask {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" ReplicationTask
newValue, Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
instance Property "TargetEndpointArn" ReplicationTask where
type PropertyType "TargetEndpointArn" ReplicationTask = Value Prelude.Text
set :: PropertyType "TargetEndpointArn" ReplicationTask
-> ReplicationTask -> ReplicationTask
set PropertyType "TargetEndpointArn" ReplicationTask
newValue ReplicationTask {Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ReplicationTask -> ()
cdcStartPosition :: ReplicationTask -> Maybe (Value Text)
cdcStartTime :: ReplicationTask -> Maybe (Value Double)
cdcStopPosition :: ReplicationTask -> Maybe (Value Text)
migrationType :: ReplicationTask -> Value Text
replicationInstanceArn :: ReplicationTask -> Value Text
replicationTaskIdentifier :: ReplicationTask -> Maybe (Value Text)
replicationTaskSettings :: ReplicationTask -> Maybe (Value Text)
resourceIdentifier :: ReplicationTask -> Maybe (Value Text)
sourceEndpointArn :: ReplicationTask -> Value Text
tableMappings :: ReplicationTask -> Value Text
tags :: ReplicationTask -> Maybe [Tag]
targetEndpointArn :: ReplicationTask -> Value Text
taskData :: ReplicationTask -> Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
= ReplicationTask {targetEndpointArn :: Value Text
targetEndpointArn = PropertyType "TargetEndpointArn" ReplicationTask
Value Text
newValue, Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
taskData :: Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
taskData :: Maybe (Value Text)
..}
instance Property "TaskData" ReplicationTask where
type PropertyType "TaskData" ReplicationTask = Value Prelude.Text
set :: PropertyType "TaskData" ReplicationTask
-> ReplicationTask -> ReplicationTask
set PropertyType "TaskData" ReplicationTask
newValue ReplicationTask {Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ReplicationTask -> ()
cdcStartPosition :: ReplicationTask -> Maybe (Value Text)
cdcStartTime :: ReplicationTask -> Maybe (Value Double)
cdcStopPosition :: ReplicationTask -> Maybe (Value Text)
migrationType :: ReplicationTask -> Value Text
replicationInstanceArn :: ReplicationTask -> Value Text
replicationTaskIdentifier :: ReplicationTask -> Maybe (Value Text)
replicationTaskSettings :: ReplicationTask -> Maybe (Value Text)
resourceIdentifier :: ReplicationTask -> Maybe (Value Text)
sourceEndpointArn :: ReplicationTask -> Value Text
tableMappings :: ReplicationTask -> Value Text
tags :: ReplicationTask -> Maybe [Tag]
targetEndpointArn :: ReplicationTask -> Value Text
taskData :: ReplicationTask -> Maybe (Value Text)
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
taskData :: Maybe (Value Text)
..}
= ReplicationTask {taskData :: Maybe (Value Text)
taskData = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "TaskData" ReplicationTask
Value Text
newValue, Maybe [Tag]
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
haddock_workaround_ :: ()
cdcStartPosition :: Maybe (Value Text)
cdcStartTime :: Maybe (Value Double)
cdcStopPosition :: Maybe (Value Text)
migrationType :: Value Text
replicationInstanceArn :: Value Text
replicationTaskIdentifier :: Maybe (Value Text)
replicationTaskSettings :: Maybe (Value Text)
resourceIdentifier :: Maybe (Value Text)
sourceEndpointArn :: Value Text
tableMappings :: Value Text
tags :: Maybe [Tag]
targetEndpointArn :: Value Text
..}