| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
RON.Schema
Documentation
data CaseTransform Source #
Constructors
| TitleCase |
Instances
| Show CaseTransform Source # | |
Defined in RON.Schema Methods showsPrec :: Int -> CaseTransform -> ShowS # show :: CaseTransform -> String # showList :: [CaseTransform] -> ShowS # | |
| FromEDN CaseTransform Source # | |
Defined in RON.Schema.EDN Methods parseEDN :: TaggedValue -> Parser CaseTransform # parseEDNv :: Value -> Parser CaseTransform # | |
data Declaration stage Source #
Constructors
| DAlias (Alias stage) | |
| DEnum TEnum | |
| DOpaqueAtoms Opaque | |
| DOpaqueObject Opaque | |
| DStructLww (StructLww stage) | |
| DStructSet (StructSet stage) |
Instances
| (Show (UseType stage), Show (XField stage)) => Show (Declaration stage) Source # | |
Defined in RON.Schema Methods showsPrec :: Int -> Declaration stage -> ShowS # show :: Declaration stage -> String # showList :: [Declaration stage] -> ShowS # | |
| FromEDN (Declaration Parsed) Source # | |
Defined in RON.Schema.EDN Methods parseEDN :: TaggedValue -> Parser (Declaration Parsed) # | |
data Field (stage :: Stage) Source #
Constructors
| Field | |
Fields
| |
newtype FieldAnnotations Source #
Constructors
| FieldAnnotations | |
Fields | |
Instances
| Show FieldAnnotations Source # | |
Defined in RON.Schema Methods showsPrec :: Int -> FieldAnnotations -> ShowS # show :: FieldAnnotations -> String # showList :: [FieldAnnotations] -> ShowS # | |
| FromEDN FieldAnnotations Source # | |
Defined in RON.Schema.EDN Methods parseEDN :: TaggedValue -> Parser FieldAnnotations # parseEDNv :: Value -> Parser FieldAnnotations # | |
data MergeStrategy Source #
Instances
| Eq MergeStrategy Source # | |
Defined in RON.Schema Methods (==) :: MergeStrategy -> MergeStrategy -> Bool # (/=) :: MergeStrategy -> MergeStrategy -> Bool # | |
| Show MergeStrategy Source # | |
Defined in RON.Schema Methods showsPrec :: Int -> MergeStrategy -> ShowS # show :: MergeStrategy -> String # showList :: [MergeStrategy] -> ShowS # | |
| FromEDN MergeStrategy Source # | |
Defined in RON.Schema.EDN Methods parseEDN :: TaggedValue -> Parser MergeStrategy # parseEDNv :: Value -> Parser MergeStrategy # | |
Constructors
| Opaque | |
Fields
| |
opaqueAtoms :: Text -> OpaqueAnnotations -> RonType Source #
opaqueAtoms_ :: Text -> RonType Source #
opaqueObject :: Text -> OpaqueAnnotations -> RonType Source #
newtype OpaqueAnnotations Source #
Constructors
| OpaqueAnnotations | |
Fields
| |
Instances
| Show OpaqueAnnotations Source # | |
Defined in RON.Schema Methods showsPrec :: Int -> OpaqueAnnotations -> ShowS # show :: OpaqueAnnotations -> String # showList :: [OpaqueAnnotations] -> ShowS # | |
type family Schema (stage :: Stage) where ... Source #
Equations
| Schema Parsed = [Declaration Parsed] | |
| Schema Resolved = Map TypeName (Declaration Resolved) |
data Struct (encoding :: StructEncoding) stage Source #
Constructors
| Struct | |
Fields
| |
data StructAnnotations Source #
Constructors
| StructAnnotations | |
Instances
| Show StructAnnotations Source # | |
Defined in RON.Schema Methods showsPrec :: Int -> StructAnnotations -> ShowS # show :: StructAnnotations -> String # showList :: [StructAnnotations] -> ShowS # | |
| FromEDN StructAnnotations Source # | |
Defined in RON.Schema.EDN Methods parseEDN :: TaggedValue -> Parser StructAnnotations # parseEDNv :: Value -> Parser StructAnnotations # | |
data StructEncoding Source #