module Stratosphere.Transfer.Agreement.CustomDirectoriesProperty (
CustomDirectoriesProperty(..), mkCustomDirectoriesProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data CustomDirectoriesProperty
=
CustomDirectoriesProperty {CustomDirectoriesProperty -> ()
haddock_workaround_ :: (),
CustomDirectoriesProperty -> Value Text
failedFilesDirectory :: (Value Prelude.Text),
CustomDirectoriesProperty -> Value Text
mdnFilesDirectory :: (Value Prelude.Text),
CustomDirectoriesProperty -> Value Text
payloadFilesDirectory :: (Value Prelude.Text),
CustomDirectoriesProperty -> Value Text
statusFilesDirectory :: (Value Prelude.Text),
CustomDirectoriesProperty -> Value Text
temporaryFilesDirectory :: (Value Prelude.Text)}
deriving stock (CustomDirectoriesProperty -> CustomDirectoriesProperty -> Bool
(CustomDirectoriesProperty -> CustomDirectoriesProperty -> Bool)
-> (CustomDirectoriesProperty -> CustomDirectoriesProperty -> Bool)
-> Eq CustomDirectoriesProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: CustomDirectoriesProperty -> CustomDirectoriesProperty -> Bool
== :: CustomDirectoriesProperty -> CustomDirectoriesProperty -> Bool
$c/= :: CustomDirectoriesProperty -> CustomDirectoriesProperty -> Bool
/= :: CustomDirectoriesProperty -> CustomDirectoriesProperty -> Bool
Prelude.Eq, Int -> CustomDirectoriesProperty -> ShowS
[CustomDirectoriesProperty] -> ShowS
CustomDirectoriesProperty -> String
(Int -> CustomDirectoriesProperty -> ShowS)
-> (CustomDirectoriesProperty -> String)
-> ([CustomDirectoriesProperty] -> ShowS)
-> Show CustomDirectoriesProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> CustomDirectoriesProperty -> ShowS
showsPrec :: Int -> CustomDirectoriesProperty -> ShowS
$cshow :: CustomDirectoriesProperty -> String
show :: CustomDirectoriesProperty -> String
$cshowList :: [CustomDirectoriesProperty] -> ShowS
showList :: [CustomDirectoriesProperty] -> ShowS
Prelude.Show)
mkCustomDirectoriesProperty ::
Value Prelude.Text
-> Value Prelude.Text
-> Value Prelude.Text
-> Value Prelude.Text
-> Value Prelude.Text -> CustomDirectoriesProperty
mkCustomDirectoriesProperty :: Value Text
-> Value Text
-> Value Text
-> Value Text
-> Value Text
-> CustomDirectoriesProperty
mkCustomDirectoriesProperty
Value Text
failedFilesDirectory
Value Text
mdnFilesDirectory
Value Text
payloadFilesDirectory
Value Text
statusFilesDirectory
Value Text
temporaryFilesDirectory
= CustomDirectoriesProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (),
failedFilesDirectory :: Value Text
failedFilesDirectory = Value Text
failedFilesDirectory,
mdnFilesDirectory :: Value Text
mdnFilesDirectory = Value Text
mdnFilesDirectory,
payloadFilesDirectory :: Value Text
payloadFilesDirectory = Value Text
payloadFilesDirectory,
statusFilesDirectory :: Value Text
statusFilesDirectory = Value Text
statusFilesDirectory,
temporaryFilesDirectory :: Value Text
temporaryFilesDirectory = Value Text
temporaryFilesDirectory}
instance ToResourceProperties CustomDirectoriesProperty where
toResourceProperties :: CustomDirectoriesProperty -> ResourceProperties
toResourceProperties CustomDirectoriesProperty {()
Value Text
haddock_workaround_ :: CustomDirectoriesProperty -> ()
failedFilesDirectory :: CustomDirectoriesProperty -> Value Text
mdnFilesDirectory :: CustomDirectoriesProperty -> Value Text
payloadFilesDirectory :: CustomDirectoriesProperty -> Value Text
statusFilesDirectory :: CustomDirectoriesProperty -> Value Text
temporaryFilesDirectory :: CustomDirectoriesProperty -> Value Text
haddock_workaround_ :: ()
failedFilesDirectory :: Value Text
mdnFilesDirectory :: Value Text
payloadFilesDirectory :: Value Text
statusFilesDirectory :: Value Text
temporaryFilesDirectory :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::Transfer::Agreement.CustomDirectories",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"FailedFilesDirectory" 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
failedFilesDirectory,
Key
"MdnFilesDirectory" 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
mdnFilesDirectory,
Key
"PayloadFilesDirectory" 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
payloadFilesDirectory,
Key
"StatusFilesDirectory" 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
statusFilesDirectory,
Key
"TemporaryFilesDirectory" 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
temporaryFilesDirectory]}
instance JSON.ToJSON CustomDirectoriesProperty where
toJSON :: CustomDirectoriesProperty -> Value
toJSON CustomDirectoriesProperty {()
Value Text
haddock_workaround_ :: CustomDirectoriesProperty -> ()
failedFilesDirectory :: CustomDirectoriesProperty -> Value Text
mdnFilesDirectory :: CustomDirectoriesProperty -> Value Text
payloadFilesDirectory :: CustomDirectoriesProperty -> Value Text
statusFilesDirectory :: CustomDirectoriesProperty -> Value Text
temporaryFilesDirectory :: CustomDirectoriesProperty -> Value Text
haddock_workaround_ :: ()
failedFilesDirectory :: Value Text
mdnFilesDirectory :: Value Text
payloadFilesDirectory :: Value Text
statusFilesDirectory :: Value Text
temporaryFilesDirectory :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"FailedFilesDirectory" 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
failedFilesDirectory,
Key
"MdnFilesDirectory" 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
mdnFilesDirectory,
Key
"PayloadFilesDirectory" 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
payloadFilesDirectory,
Key
"StatusFilesDirectory" 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
statusFilesDirectory,
Key
"TemporaryFilesDirectory" 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
temporaryFilesDirectory]
instance Property "FailedFilesDirectory" CustomDirectoriesProperty where
type PropertyType "FailedFilesDirectory" CustomDirectoriesProperty = Value Prelude.Text
set :: PropertyType "FailedFilesDirectory" CustomDirectoriesProperty
-> CustomDirectoriesProperty -> CustomDirectoriesProperty
set PropertyType "FailedFilesDirectory" CustomDirectoriesProperty
newValue CustomDirectoriesProperty {()
Value Text
haddock_workaround_ :: CustomDirectoriesProperty -> ()
failedFilesDirectory :: CustomDirectoriesProperty -> Value Text
mdnFilesDirectory :: CustomDirectoriesProperty -> Value Text
payloadFilesDirectory :: CustomDirectoriesProperty -> Value Text
statusFilesDirectory :: CustomDirectoriesProperty -> Value Text
temporaryFilesDirectory :: CustomDirectoriesProperty -> Value Text
haddock_workaround_ :: ()
failedFilesDirectory :: Value Text
mdnFilesDirectory :: Value Text
payloadFilesDirectory :: Value Text
statusFilesDirectory :: Value Text
temporaryFilesDirectory :: Value Text
..}
= CustomDirectoriesProperty {failedFilesDirectory :: Value Text
failedFilesDirectory = PropertyType "FailedFilesDirectory" CustomDirectoriesProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
mdnFilesDirectory :: Value Text
payloadFilesDirectory :: Value Text
statusFilesDirectory :: Value Text
temporaryFilesDirectory :: Value Text
haddock_workaround_ :: ()
mdnFilesDirectory :: Value Text
payloadFilesDirectory :: Value Text
statusFilesDirectory :: Value Text
temporaryFilesDirectory :: Value Text
..}
instance Property "MdnFilesDirectory" CustomDirectoriesProperty where
type PropertyType "MdnFilesDirectory" CustomDirectoriesProperty = Value Prelude.Text
set :: PropertyType "MdnFilesDirectory" CustomDirectoriesProperty
-> CustomDirectoriesProperty -> CustomDirectoriesProperty
set PropertyType "MdnFilesDirectory" CustomDirectoriesProperty
newValue CustomDirectoriesProperty {()
Value Text
haddock_workaround_ :: CustomDirectoriesProperty -> ()
failedFilesDirectory :: CustomDirectoriesProperty -> Value Text
mdnFilesDirectory :: CustomDirectoriesProperty -> Value Text
payloadFilesDirectory :: CustomDirectoriesProperty -> Value Text
statusFilesDirectory :: CustomDirectoriesProperty -> Value Text
temporaryFilesDirectory :: CustomDirectoriesProperty -> Value Text
haddock_workaround_ :: ()
failedFilesDirectory :: Value Text
mdnFilesDirectory :: Value Text
payloadFilesDirectory :: Value Text
statusFilesDirectory :: Value Text
temporaryFilesDirectory :: Value Text
..}
= CustomDirectoriesProperty {mdnFilesDirectory :: Value Text
mdnFilesDirectory = PropertyType "MdnFilesDirectory" CustomDirectoriesProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
failedFilesDirectory :: Value Text
payloadFilesDirectory :: Value Text
statusFilesDirectory :: Value Text
temporaryFilesDirectory :: Value Text
haddock_workaround_ :: ()
failedFilesDirectory :: Value Text
payloadFilesDirectory :: Value Text
statusFilesDirectory :: Value Text
temporaryFilesDirectory :: Value Text
..}
instance Property "PayloadFilesDirectory" CustomDirectoriesProperty where
type PropertyType "PayloadFilesDirectory" CustomDirectoriesProperty = Value Prelude.Text
set :: PropertyType "PayloadFilesDirectory" CustomDirectoriesProperty
-> CustomDirectoriesProperty -> CustomDirectoriesProperty
set PropertyType "PayloadFilesDirectory" CustomDirectoriesProperty
newValue CustomDirectoriesProperty {()
Value Text
haddock_workaround_ :: CustomDirectoriesProperty -> ()
failedFilesDirectory :: CustomDirectoriesProperty -> Value Text
mdnFilesDirectory :: CustomDirectoriesProperty -> Value Text
payloadFilesDirectory :: CustomDirectoriesProperty -> Value Text
statusFilesDirectory :: CustomDirectoriesProperty -> Value Text
temporaryFilesDirectory :: CustomDirectoriesProperty -> Value Text
haddock_workaround_ :: ()
failedFilesDirectory :: Value Text
mdnFilesDirectory :: Value Text
payloadFilesDirectory :: Value Text
statusFilesDirectory :: Value Text
temporaryFilesDirectory :: Value Text
..}
= CustomDirectoriesProperty {payloadFilesDirectory :: Value Text
payloadFilesDirectory = PropertyType "PayloadFilesDirectory" CustomDirectoriesProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
failedFilesDirectory :: Value Text
mdnFilesDirectory :: Value Text
statusFilesDirectory :: Value Text
temporaryFilesDirectory :: Value Text
haddock_workaround_ :: ()
failedFilesDirectory :: Value Text
mdnFilesDirectory :: Value Text
statusFilesDirectory :: Value Text
temporaryFilesDirectory :: Value Text
..}
instance Property "StatusFilesDirectory" CustomDirectoriesProperty where
type PropertyType "StatusFilesDirectory" CustomDirectoriesProperty = Value Prelude.Text
set :: PropertyType "StatusFilesDirectory" CustomDirectoriesProperty
-> CustomDirectoriesProperty -> CustomDirectoriesProperty
set PropertyType "StatusFilesDirectory" CustomDirectoriesProperty
newValue CustomDirectoriesProperty {()
Value Text
haddock_workaround_ :: CustomDirectoriesProperty -> ()
failedFilesDirectory :: CustomDirectoriesProperty -> Value Text
mdnFilesDirectory :: CustomDirectoriesProperty -> Value Text
payloadFilesDirectory :: CustomDirectoriesProperty -> Value Text
statusFilesDirectory :: CustomDirectoriesProperty -> Value Text
temporaryFilesDirectory :: CustomDirectoriesProperty -> Value Text
haddock_workaround_ :: ()
failedFilesDirectory :: Value Text
mdnFilesDirectory :: Value Text
payloadFilesDirectory :: Value Text
statusFilesDirectory :: Value Text
temporaryFilesDirectory :: Value Text
..}
= CustomDirectoriesProperty {statusFilesDirectory :: Value Text
statusFilesDirectory = PropertyType "StatusFilesDirectory" CustomDirectoriesProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
failedFilesDirectory :: Value Text
mdnFilesDirectory :: Value Text
payloadFilesDirectory :: Value Text
temporaryFilesDirectory :: Value Text
haddock_workaround_ :: ()
failedFilesDirectory :: Value Text
mdnFilesDirectory :: Value Text
payloadFilesDirectory :: Value Text
temporaryFilesDirectory :: Value Text
..}
instance Property "TemporaryFilesDirectory" CustomDirectoriesProperty where
type PropertyType "TemporaryFilesDirectory" CustomDirectoriesProperty = Value Prelude.Text
set :: PropertyType "TemporaryFilesDirectory" CustomDirectoriesProperty
-> CustomDirectoriesProperty -> CustomDirectoriesProperty
set PropertyType "TemporaryFilesDirectory" CustomDirectoriesProperty
newValue CustomDirectoriesProperty {()
Value Text
haddock_workaround_ :: CustomDirectoriesProperty -> ()
failedFilesDirectory :: CustomDirectoriesProperty -> Value Text
mdnFilesDirectory :: CustomDirectoriesProperty -> Value Text
payloadFilesDirectory :: CustomDirectoriesProperty -> Value Text
statusFilesDirectory :: CustomDirectoriesProperty -> Value Text
temporaryFilesDirectory :: CustomDirectoriesProperty -> Value Text
haddock_workaround_ :: ()
failedFilesDirectory :: Value Text
mdnFilesDirectory :: Value Text
payloadFilesDirectory :: Value Text
statusFilesDirectory :: Value Text
temporaryFilesDirectory :: Value Text
..}
= CustomDirectoriesProperty
{temporaryFilesDirectory :: Value Text
temporaryFilesDirectory = PropertyType "TemporaryFilesDirectory" CustomDirectoriesProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
failedFilesDirectory :: Value Text
mdnFilesDirectory :: Value Text
payloadFilesDirectory :: Value Text
statusFilesDirectory :: Value Text
haddock_workaround_ :: ()
failedFilesDirectory :: Value Text
mdnFilesDirectory :: Value Text
payloadFilesDirectory :: Value Text
statusFilesDirectory :: Value Text
..}