duckling-0.2.0.0: A Haskell library for parsing text into structured data.
Safe HaskellNone
LanguageHaskell2010

Duckling.Quantity.Types

Documentation

data Unit Source #

Instances

Instances details
Eq Unit Source # 
Instance details

Defined in Duckling.Quantity.Types

Methods

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

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

Ord Unit Source # 
Instance details

Defined in Duckling.Quantity.Types

Methods

compare :: Unit -> Unit -> Ordering #

(<) :: Unit -> Unit -> Bool #

(<=) :: Unit -> Unit -> Bool #

(>) :: Unit -> Unit -> Bool #

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

max :: Unit -> Unit -> Unit #

min :: Unit -> Unit -> Unit #

Show Unit Source # 
Instance details

Defined in Duckling.Quantity.Types

Methods

showsPrec :: Int -> Unit -> ShowS #

show :: Unit -> String #

showList :: [Unit] -> ShowS #

Generic Unit Source # 
Instance details

Defined in Duckling.Quantity.Types

Associated Types

type Rep Unit :: Type -> Type #

Methods

from :: Unit -> Rep Unit x #

to :: Rep Unit x -> Unit #

Hashable Unit Source # 
Instance details

Defined in Duckling.Quantity.Types

Methods

hashWithSalt :: Int -> Unit -> Int #

hash :: Unit -> Int #

ToJSON Unit Source # 
Instance details

Defined in Duckling.Quantity.Types

NFData Unit Source # 
Instance details

Defined in Duckling.Quantity.Types

Methods

rnf :: Unit -> () #

type Rep Unit Source # 
Instance details

Defined in Duckling.Quantity.Types

type Rep Unit = D1 ('MetaData "Unit" "Duckling.Quantity.Types" "duckling-0.2.0.0-4AU1pRwMU7E8YjNdB7ILfy" 'False) (((C1 ('MetaCons "Bowl" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Cup" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Custom" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))) :+: (C1 ('MetaCons "Dish" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Gram" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Ounce" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "Pint" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Pound" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Quart" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "Tablespoon" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Teaspoon" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Unnamed" 'PrefixI 'False) (U1 :: Type -> Type)))))

data QuantityData Source #

Instances

Instances details
Eq QuantityData Source # 
Instance details

Defined in Duckling.Quantity.Types

Ord QuantityData Source # 
Instance details

Defined in Duckling.Quantity.Types

Show QuantityData Source # 
Instance details

Defined in Duckling.Quantity.Types

Generic QuantityData Source # 
Instance details

Defined in Duckling.Quantity.Types

Associated Types

type Rep QuantityData :: Type -> Type #

Hashable QuantityData Source # 
Instance details

Defined in Duckling.Quantity.Types

NFData QuantityData Source # 
Instance details

Defined in Duckling.Quantity.Types

Methods

rnf :: QuantityData -> () #

Resolve QuantityData Source # 
Instance details

Defined in Duckling.Quantity.Types

Associated Types

type ResolvedValue QuantityData Source #

type Rep QuantityData Source # 
Instance details

Defined in Duckling.Quantity.Types

type ResolvedValue QuantityData Source # 
Instance details

Defined in Duckling.Quantity.Types

data IntervalDirection Source #

Constructors

Above 
Under 

Instances

Instances details
Eq IntervalDirection Source # 
Instance details

Defined in Duckling.Quantity.Types

Ord IntervalDirection Source # 
Instance details

Defined in Duckling.Quantity.Types

Show IntervalDirection Source # 
Instance details

Defined in Duckling.Quantity.Types

Generic IntervalDirection Source # 
Instance details

Defined in Duckling.Quantity.Types

Associated Types

type Rep IntervalDirection :: Type -> Type #

Hashable IntervalDirection Source # 
Instance details

Defined in Duckling.Quantity.Types

NFData IntervalDirection Source # 
Instance details

Defined in Duckling.Quantity.Types

Methods

rnf :: IntervalDirection -> () #

type Rep IntervalDirection Source # 
Instance details

Defined in Duckling.Quantity.Types

type Rep IntervalDirection = D1 ('MetaData "IntervalDirection" "Duckling.Quantity.Types" "duckling-0.2.0.0-4AU1pRwMU7E8YjNdB7ILfy" 'False) (C1 ('MetaCons "Above" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Under" 'PrefixI 'False) (U1 :: Type -> Type))

data SingleValue Source #

Constructors

SingleValue 

Instances

Instances details
Eq SingleValue Source # 
Instance details

Defined in Duckling.Quantity.Types

Ord SingleValue Source # 
Instance details

Defined in Duckling.Quantity.Types

Show SingleValue Source # 
Instance details

Defined in Duckling.Quantity.Types

Generic SingleValue Source # 
Instance details

Defined in Duckling.Quantity.Types

Associated Types

type Rep SingleValue :: Type -> Type #

Hashable SingleValue Source # 
Instance details

Defined in Duckling.Quantity.Types

ToJSON SingleValue Source # 
Instance details

Defined in Duckling.Quantity.Types

NFData SingleValue Source # 
Instance details

Defined in Duckling.Quantity.Types

Methods

rnf :: SingleValue -> () #

type Rep SingleValue Source # 
Instance details

Defined in Duckling.Quantity.Types

type Rep SingleValue = D1 ('MetaData "SingleValue" "Duckling.Quantity.Types" "duckling-0.2.0.0-4AU1pRwMU7E8YjNdB7ILfy" 'False) (C1 ('MetaCons "SingleValue" 'PrefixI 'True) (S1 ('MetaSel ('Just "vUnit") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Unit) :*: (S1 ('MetaSel ('Just "vValue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Double) :*: S1 ('MetaSel ('Just "vProduct") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)))))