module Stratosphere.AppTest.TestCase.InputProperty (
module Exports, InputProperty(..), mkInputProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.AppTest.TestCase.InputFileProperty as Exports
import Stratosphere.ResourceProperties
data InputProperty
=
InputProperty {InputProperty -> ()
haddock_workaround_ :: (),
InputProperty -> InputFileProperty
file :: InputFileProperty}
deriving stock (InputProperty -> InputProperty -> Bool
(InputProperty -> InputProperty -> Bool)
-> (InputProperty -> InputProperty -> Bool) -> Eq InputProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: InputProperty -> InputProperty -> Bool
== :: InputProperty -> InputProperty -> Bool
$c/= :: InputProperty -> InputProperty -> Bool
/= :: InputProperty -> InputProperty -> Bool
Prelude.Eq, Int -> InputProperty -> ShowS
[InputProperty] -> ShowS
InputProperty -> String
(Int -> InputProperty -> ShowS)
-> (InputProperty -> String)
-> ([InputProperty] -> ShowS)
-> Show InputProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> InputProperty -> ShowS
showsPrec :: Int -> InputProperty -> ShowS
$cshow :: InputProperty -> String
show :: InputProperty -> String
$cshowList :: [InputProperty] -> ShowS
showList :: [InputProperty] -> ShowS
Prelude.Show)
mkInputProperty :: InputFileProperty -> InputProperty
mkInputProperty :: InputFileProperty -> InputProperty
mkInputProperty InputFileProperty
file
= InputProperty {haddock_workaround_ :: ()
haddock_workaround_ = (), file :: InputFileProperty
file = InputFileProperty
file}
instance ToResourceProperties InputProperty where
toResourceProperties :: InputProperty -> ResourceProperties
toResourceProperties InputProperty {()
InputFileProperty
haddock_workaround_ :: InputProperty -> ()
file :: InputProperty -> InputFileProperty
haddock_workaround_ :: ()
file :: InputFileProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::AppTest::TestCase.Input",
supportsTags :: Bool
supportsTags = Bool
Prelude.False, properties :: Object
properties = [Key
"File" Key -> InputFileProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= InputFileProperty
file]}
instance JSON.ToJSON InputProperty where
toJSON :: InputProperty -> Value
toJSON InputProperty {()
InputFileProperty
haddock_workaround_ :: InputProperty -> ()
file :: InputProperty -> InputFileProperty
haddock_workaround_ :: ()
file :: InputFileProperty
..} = [(Key, Value)] -> Value
JSON.object [Key
"File" Key -> InputFileProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= InputFileProperty
file]
instance Property "File" InputProperty where
type PropertyType "File" InputProperty = InputFileProperty
set :: PropertyType "File" InputProperty -> InputProperty -> InputProperty
set PropertyType "File" InputProperty
newValue InputProperty {()
InputFileProperty
haddock_workaround_ :: InputProperty -> ()
file :: InputProperty -> InputFileProperty
haddock_workaround_ :: ()
file :: InputFileProperty
..}
= InputProperty {file :: InputFileProperty
file = PropertyType "File" InputProperty
InputFileProperty
newValue, ()
haddock_workaround_ :: ()
haddock_workaround_ :: ()
..}