argo-0.2022.2.27: Parse and render JSON.
Safe HaskellSafe-Inferred
LanguageHaskell2010

Argo.Internal.Schema.Schema

Synopsis

Documentation

data Schema Source #

Instances

Instances details
Eq Schema Source # 
Instance details

Defined in Argo.Internal.Schema.Schema

Methods

(==) :: Schema -> Schema -> Bool #

(/=) :: Schema -> Schema -> Bool #

Show Schema Source # 
Instance details

Defined in Argo.Internal.Schema.Schema

Generic Schema Source # 
Instance details

Defined in Argo.Internal.Schema.Schema

Associated Types

type Rep Schema :: Type -> Type #

Methods

from :: Schema -> Rep Schema x #

to :: Rep Schema x -> Schema #

Semigroup Schema Source # 
Instance details

Defined in Argo.Internal.Schema.Schema

Monoid Schema Source # 
Instance details

Defined in Argo.Internal.Schema.Schema

NFData Schema Source # 
Instance details

Defined in Argo.Internal.Schema.Schema

Methods

rnf :: Schema -> () #

HasCodec Schema Source # 
Instance details

Defined in Argo.Internal.Class.HasCodec

Lift Schema Source # 
Instance details

Defined in Argo.Internal.Schema.Schema

Methods

lift :: Schema -> Q Exp #

liftTyped :: Schema -> Q (TExp Schema) #

type Rep Schema Source # 
Instance details

Defined in Argo.Internal.Schema.Schema

type Rep Schema = D1 ('MetaData "Schema" "Argo.Internal.Schema.Schema" "argo-0.2022.2.27-EIRSB3gebOh7YnqVPHHxsB" 'False) (((C1 ('MetaCons "Array" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Natural)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Natural))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Either Schema (NonEmpty Schema))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Schema)))) :+: (C1 ('MetaCons "Boolean" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Const" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Value)))) :+: (C1 ('MetaCons "False" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Integer" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Integer)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Integer))) :+: C1 ('MetaCons "Null" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "Number" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Object" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Name, Schema)]) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Name]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Schema)))) :+: C1 ('MetaCons "OneOf" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Schema])))) :+: (C1 ('MetaCons "Ref" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Identifier)) :+: (C1 ('MetaCons "String" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Natural)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Natural))) :+: C1 ('MetaCons "True" 'PrefixI 'False) (U1 :: Type -> Type)))))

member :: String -> a -> Member a Source #