| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Data.OpenApi.Compare.Validate.Schema.TypedJson
Synopsis
- data JsonType
- describeJSONType :: IsString s => JsonType -> s
- data TypedValue :: JsonType -> Type where
- TNull :: TypedValue 'Null
- TBool :: !Bool -> TypedValue 'Boolean
- TNumber :: !Scientific -> TypedValue 'Number
- TString :: !Text -> TypedValue 'String
- TArray :: !Array -> TypedValue 'Array
- TObject :: !Object -> TypedValue 'Object
- untypeValue :: TypedValue t -> Value
- data ForeachType (f :: JsonType -> Type) = ForeachType {}
- foldType :: Monoid m => (forall x. Typeable x => JsonType -> (ForeachType f -> f x) -> m) -> m
- forType_ :: Applicative m => (forall x. Typeable x => JsonType -> (ForeachType f -> f x) -> m ()) -> m ()
Documentation
describeJSONType :: IsString s => JsonType -> s Source #
data TypedValue :: JsonType -> Type where Source #
A Value whose type we know
Constructors
| TNull :: TypedValue 'Null | |
| TBool :: !Bool -> TypedValue 'Boolean | |
| TNumber :: !Scientific -> TypedValue 'Number | |
| TString :: !Text -> TypedValue 'String | |
| TArray :: !Array -> TypedValue 'Array | |
| TObject :: !Object -> TypedValue 'Object |
Instances
| Eq (TypedValue t) Source # | |
| Ord (TypedValue t) Source # | |
Defined in Data.OpenApi.Compare.Validate.Schema.TypedJson Methods compare :: TypedValue t -> TypedValue t -> Ordering # (<) :: TypedValue t -> TypedValue t -> Bool # (<=) :: TypedValue t -> TypedValue t -> Bool # (>) :: TypedValue t -> TypedValue t -> Bool # (>=) :: TypedValue t -> TypedValue t -> Bool # max :: TypedValue t -> TypedValue t -> TypedValue t # min :: TypedValue t -> TypedValue t -> TypedValue t # | |
| Show (TypedValue t) Source # | |
Defined in Data.OpenApi.Compare.Validate.Schema.TypedJson Methods showsPrec :: Int -> TypedValue t -> ShowS # show :: TypedValue t -> String # showList :: [TypedValue t] -> ShowS # | |
untypeValue :: TypedValue t -> Value Source #
data ForeachType (f :: JsonType -> Type) Source #
Constructors
| ForeachType | |
Instances
foldType :: Monoid m => (forall x. Typeable x => JsonType -> (ForeachType f -> f x) -> m) -> m Source #
forType_ :: Applicative m => (forall x. Typeable x => JsonType -> (ForeachType f -> f x) -> m ()) -> m () Source #