module Stratosphere.Bedrock.DataAutomationProject.DocumentStandardExtractionProperty (
module Exports, DocumentStandardExtractionProperty(..),
mkDocumentStandardExtractionProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.Bedrock.DataAutomationProject.DocumentBoundingBoxProperty as Exports
import {-# SOURCE #-} Stratosphere.Bedrock.DataAutomationProject.DocumentExtractionGranularityProperty as Exports
import Stratosphere.ResourceProperties
data DocumentStandardExtractionProperty
=
DocumentStandardExtractionProperty {DocumentStandardExtractionProperty -> ()
haddock_workaround_ :: (),
DocumentStandardExtractionProperty -> DocumentBoundingBoxProperty
boundingBox :: DocumentBoundingBoxProperty,
DocumentStandardExtractionProperty
-> DocumentExtractionGranularityProperty
granularity :: DocumentExtractionGranularityProperty}
deriving stock (DocumentStandardExtractionProperty
-> DocumentStandardExtractionProperty -> Bool
(DocumentStandardExtractionProperty
-> DocumentStandardExtractionProperty -> Bool)
-> (DocumentStandardExtractionProperty
-> DocumentStandardExtractionProperty -> Bool)
-> Eq DocumentStandardExtractionProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: DocumentStandardExtractionProperty
-> DocumentStandardExtractionProperty -> Bool
== :: DocumentStandardExtractionProperty
-> DocumentStandardExtractionProperty -> Bool
$c/= :: DocumentStandardExtractionProperty
-> DocumentStandardExtractionProperty -> Bool
/= :: DocumentStandardExtractionProperty
-> DocumentStandardExtractionProperty -> Bool
Prelude.Eq, Int -> DocumentStandardExtractionProperty -> ShowS
[DocumentStandardExtractionProperty] -> ShowS
DocumentStandardExtractionProperty -> String
(Int -> DocumentStandardExtractionProperty -> ShowS)
-> (DocumentStandardExtractionProperty -> String)
-> ([DocumentStandardExtractionProperty] -> ShowS)
-> Show DocumentStandardExtractionProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> DocumentStandardExtractionProperty -> ShowS
showsPrec :: Int -> DocumentStandardExtractionProperty -> ShowS
$cshow :: DocumentStandardExtractionProperty -> String
show :: DocumentStandardExtractionProperty -> String
$cshowList :: [DocumentStandardExtractionProperty] -> ShowS
showList :: [DocumentStandardExtractionProperty] -> ShowS
Prelude.Show)
mkDocumentStandardExtractionProperty ::
DocumentBoundingBoxProperty
-> DocumentExtractionGranularityProperty
-> DocumentStandardExtractionProperty
mkDocumentStandardExtractionProperty :: DocumentBoundingBoxProperty
-> DocumentExtractionGranularityProperty
-> DocumentStandardExtractionProperty
mkDocumentStandardExtractionProperty DocumentBoundingBoxProperty
boundingBox DocumentExtractionGranularityProperty
granularity
= DocumentStandardExtractionProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), boundingBox :: DocumentBoundingBoxProperty
boundingBox = DocumentBoundingBoxProperty
boundingBox,
granularity :: DocumentExtractionGranularityProperty
granularity = DocumentExtractionGranularityProperty
granularity}
instance ToResourceProperties DocumentStandardExtractionProperty where
toResourceProperties :: DocumentStandardExtractionProperty -> ResourceProperties
toResourceProperties DocumentStandardExtractionProperty {()
DocumentBoundingBoxProperty
DocumentExtractionGranularityProperty
haddock_workaround_ :: DocumentStandardExtractionProperty -> ()
boundingBox :: DocumentStandardExtractionProperty -> DocumentBoundingBoxProperty
granularity :: DocumentStandardExtractionProperty
-> DocumentExtractionGranularityProperty
haddock_workaround_ :: ()
boundingBox :: DocumentBoundingBoxProperty
granularity :: DocumentExtractionGranularityProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::Bedrock::DataAutomationProject.DocumentStandardExtraction",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"BoundingBox" Key -> DocumentBoundingBoxProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= DocumentBoundingBoxProperty
boundingBox,
Key
"Granularity" Key -> DocumentExtractionGranularityProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= DocumentExtractionGranularityProperty
granularity]}
instance JSON.ToJSON DocumentStandardExtractionProperty where
toJSON :: DocumentStandardExtractionProperty -> Value
toJSON DocumentStandardExtractionProperty {()
DocumentBoundingBoxProperty
DocumentExtractionGranularityProperty
haddock_workaround_ :: DocumentStandardExtractionProperty -> ()
boundingBox :: DocumentStandardExtractionProperty -> DocumentBoundingBoxProperty
granularity :: DocumentStandardExtractionProperty
-> DocumentExtractionGranularityProperty
haddock_workaround_ :: ()
boundingBox :: DocumentBoundingBoxProperty
granularity :: DocumentExtractionGranularityProperty
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"BoundingBox" Key -> DocumentBoundingBoxProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= DocumentBoundingBoxProperty
boundingBox,
Key
"Granularity" Key -> DocumentExtractionGranularityProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= DocumentExtractionGranularityProperty
granularity]
instance Property "BoundingBox" DocumentStandardExtractionProperty where
type PropertyType "BoundingBox" DocumentStandardExtractionProperty = DocumentBoundingBoxProperty
set :: PropertyType "BoundingBox" DocumentStandardExtractionProperty
-> DocumentStandardExtractionProperty
-> DocumentStandardExtractionProperty
set PropertyType "BoundingBox" DocumentStandardExtractionProperty
newValue DocumentStandardExtractionProperty {()
DocumentBoundingBoxProperty
DocumentExtractionGranularityProperty
haddock_workaround_ :: DocumentStandardExtractionProperty -> ()
boundingBox :: DocumentStandardExtractionProperty -> DocumentBoundingBoxProperty
granularity :: DocumentStandardExtractionProperty
-> DocumentExtractionGranularityProperty
haddock_workaround_ :: ()
boundingBox :: DocumentBoundingBoxProperty
granularity :: DocumentExtractionGranularityProperty
..}
= DocumentStandardExtractionProperty {boundingBox :: DocumentBoundingBoxProperty
boundingBox = PropertyType "BoundingBox" DocumentStandardExtractionProperty
DocumentBoundingBoxProperty
newValue, ()
DocumentExtractionGranularityProperty
haddock_workaround_ :: ()
granularity :: DocumentExtractionGranularityProperty
haddock_workaround_ :: ()
granularity :: DocumentExtractionGranularityProperty
..}
instance Property "Granularity" DocumentStandardExtractionProperty where
type PropertyType "Granularity" DocumentStandardExtractionProperty = DocumentExtractionGranularityProperty
set :: PropertyType "Granularity" DocumentStandardExtractionProperty
-> DocumentStandardExtractionProperty
-> DocumentStandardExtractionProperty
set PropertyType "Granularity" DocumentStandardExtractionProperty
newValue DocumentStandardExtractionProperty {()
DocumentBoundingBoxProperty
DocumentExtractionGranularityProperty
haddock_workaround_ :: DocumentStandardExtractionProperty -> ()
boundingBox :: DocumentStandardExtractionProperty -> DocumentBoundingBoxProperty
granularity :: DocumentStandardExtractionProperty
-> DocumentExtractionGranularityProperty
haddock_workaround_ :: ()
boundingBox :: DocumentBoundingBoxProperty
granularity :: DocumentExtractionGranularityProperty
..}
= DocumentStandardExtractionProperty {granularity :: DocumentExtractionGranularityProperty
granularity = PropertyType "Granularity" DocumentStandardExtractionProperty
DocumentExtractionGranularityProperty
newValue, ()
DocumentBoundingBoxProperty
haddock_workaround_ :: ()
boundingBox :: DocumentBoundingBoxProperty
haddock_workaround_ :: ()
boundingBox :: DocumentBoundingBoxProperty
..}