hw-json-standard-cursor-0.2.3.2: Memory efficient JSON parser
Safe HaskellNone
LanguageHaskell2010

HaskellWorks.Data.Json.Standard.Cursor.Internal.StateMachine

Documentation

newtype IntState Source #

Constructors

IntState Int 

Instances

Instances details
Eq IntState Source # 
Instance details

Defined in HaskellWorks.Data.Json.Standard.Cursor.Internal.StateMachine

Num IntState Source # 
Instance details

Defined in HaskellWorks.Data.Json.Standard.Cursor.Internal.StateMachine

Ord IntState Source # 
Instance details

Defined in HaskellWorks.Data.Json.Standard.Cursor.Internal.StateMachine

Show IntState Source # 
Instance details

Defined in HaskellWorks.Data.Json.Standard.Cursor.Internal.StateMachine

Generic IntState Source # 
Instance details

Defined in HaskellWorks.Data.Json.Standard.Cursor.Internal.StateMachine

Associated Types

type Rep IntState :: Type -> Type #

Methods

from :: IntState -> Rep IntState x #

to :: Rep IntState x -> IntState #

type Rep IntState Source # 
Instance details

Defined in HaskellWorks.Data.Json.Standard.Cursor.Internal.StateMachine

type Rep IntState = D1 ('MetaData "IntState" "HaskellWorks.Data.Json.Standard.Cursor.Internal.StateMachine" "hw-json-standard-cursor-0.2.3.2-35k1al1NqDVKT0PRyQqSf3" 'True) (C1 ('MetaCons "IntState" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

data State Source #

Constructors

InJson 
InString 
InEscape 
InValue 

Instances

Instances details
Bounded State Source # 
Instance details

Defined in HaskellWorks.Data.Json.Standard.Cursor.Internal.StateMachine

Enum State Source # 
Instance details

Defined in HaskellWorks.Data.Json.Standard.Cursor.Internal.StateMachine

Eq State Source # 
Instance details

Defined in HaskellWorks.Data.Json.Standard.Cursor.Internal.StateMachine

Methods

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

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

Show State Source # 
Instance details

Defined in HaskellWorks.Data.Json.Standard.Cursor.Internal.StateMachine

Methods

showsPrec :: Int -> State -> ShowS #

show :: State -> String #

showList :: [State] -> ShowS #

Generic State Source # 
Instance details

Defined in HaskellWorks.Data.Json.Standard.Cursor.Internal.StateMachine

Associated Types

type Rep State :: Type -> Type #

Methods

from :: State -> Rep State x #

to :: Rep State x -> State #

type Rep State Source # 
Instance details

Defined in HaskellWorks.Data.Json.Standard.Cursor.Internal.StateMachine

type Rep State = D1 ('MetaData "State" "HaskellWorks.Data.Json.Standard.Cursor.Internal.StateMachine" "hw-json-standard-cursor-0.2.3.2-35k1al1NqDVKT0PRyQqSf3" 'False) ((C1 ('MetaCons "InJson" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InString" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "InEscape" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InValue" 'PrefixI 'False) (U1 :: Type -> Type)))