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

Duckling.Distance.Types

Documentation

data Unit Source #

Instances

Instances details
Eq Unit Source # 
Instance details

Defined in Duckling.Distance.Types

Methods

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

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

Ord Unit Source # 
Instance details

Defined in Duckling.Distance.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.Distance.Types

Methods

showsPrec :: Int -> Unit -> ShowS #

show :: Unit -> String #

showList :: [Unit] -> ShowS #

Generic Unit Source # 
Instance details

Defined in Duckling.Distance.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.Distance.Types

Methods

hashWithSalt :: Int -> Unit -> Int #

hash :: Unit -> Int #

ToJSON Unit Source # 
Instance details

Defined in Duckling.Distance.Types

NFData Unit Source # 
Instance details

Defined in Duckling.Distance.Types

Methods

rnf :: Unit -> () #

type Rep Unit Source # 
Instance details

Defined in Duckling.Distance.Types

type Rep Unit = D1 ('MetaData "Unit" "Duckling.Distance.Types" "duckling-0.2.0.0-4AU1pRwMU7E8YjNdB7ILfy" 'False) (((C1 ('MetaCons "Centimetre" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Foot" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Inch" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Kilometre" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "M" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Metre" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Mile" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Millimetre" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Yard" 'PrefixI 'False) (U1 :: Type -> Type)))))

data DistanceData Source #

Instances

Instances details
Eq DistanceData Source # 
Instance details

Defined in Duckling.Distance.Types

Ord DistanceData Source # 
Instance details

Defined in Duckling.Distance.Types

Show DistanceData Source # 
Instance details

Defined in Duckling.Distance.Types

Generic DistanceData Source # 
Instance details

Defined in Duckling.Distance.Types

Associated Types

type Rep DistanceData :: Type -> Type #

Hashable DistanceData Source # 
Instance details

Defined in Duckling.Distance.Types

NFData DistanceData Source # 
Instance details

Defined in Duckling.Distance.Types

Methods

rnf :: DistanceData -> () #

Resolve DistanceData Source # 
Instance details

Defined in Duckling.Distance.Types

Associated Types

type ResolvedValue DistanceData Source #

type Rep DistanceData Source # 
Instance details

Defined in Duckling.Distance.Types

type Rep DistanceData = D1 ('MetaData "DistanceData" "Duckling.Distance.Types" "duckling-0.2.0.0-4AU1pRwMU7E8YjNdB7ILfy" 'False) (C1 ('MetaCons "DistanceData" 'PrefixI 'True) ((S1 ('MetaSel ('Just "unit") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Unit)) :*: S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Double))) :*: (S1 ('MetaSel ('Just "minValue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Double)) :*: S1 ('MetaSel ('Just "maxValue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Double)))))
type ResolvedValue DistanceData Source # 
Instance details

Defined in Duckling.Distance.Types

data IntervalDirection Source #

Constructors

Above 
Under 

Instances

Instances details
Eq IntervalDirection Source # 
Instance details

Defined in Duckling.Distance.Types

Ord IntervalDirection Source # 
Instance details

Defined in Duckling.Distance.Types

Show IntervalDirection Source # 
Instance details

Defined in Duckling.Distance.Types

Generic IntervalDirection Source # 
Instance details

Defined in Duckling.Distance.Types

Associated Types

type Rep IntervalDirection :: Type -> Type #

Hashable IntervalDirection Source # 
Instance details

Defined in Duckling.Distance.Types

NFData IntervalDirection Source # 
Instance details

Defined in Duckling.Distance.Types

Methods

rnf :: IntervalDirection -> () #

type Rep IntervalDirection Source # 
Instance details

Defined in Duckling.Distance.Types

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