Frames-0.6.3: Data frames For working with tabular data files

Safe HaskellNone
LanguageHaskell2010

Frames.ColumnUniverse

Synopsis

Documentation

data CoRec (a :: k -> Type) (b :: [k]) :: forall k. (k -> Type) -> [k] -> Type #

Generalize algebraic sum types.

Instances
(RecApplicative ts, RecordToList ts, RApply ts, ReifyConstraint Eq Maybe ts, RMap ts) => Eq (CoRec Identity ts) 
Instance details

Defined in Data.Vinyl.CoRec

Methods

(==) :: CoRec Identity ts -> CoRec Identity ts -> Bool #

(/=) :: CoRec Identity ts -> CoRec Identity ts -> Bool #

RPureConstrained (ShowF f) ts => Show (CoRec f ts) 
Instance details

Defined in Data.Vinyl.CoRec

Methods

showsPrec :: Int -> CoRec f ts -> ShowS #

show :: CoRec f ts -> String #

showList :: [CoRec f ts] -> ShowS #

(Text ts, RPureConstrained Parseable ts) => Semigroup (CoRec ColInfo ts) Source # 
Instance details

Defined in Frames.ColumnUniverse

Methods

(<>) :: CoRec ColInfo ts -> CoRec ColInfo ts -> CoRec ColInfo ts #

sconcat :: NonEmpty (CoRec ColInfo ts) -> CoRec ColInfo ts #

stimes :: Integral b => b -> CoRec ColInfo ts -> CoRec ColInfo ts #

(Text ts, RPureConstrained Parseable ts) => Monoid (CoRec ColInfo ts) Source # 
Instance details

Defined in Frames.ColumnUniverse

(RPureConstrained Parseable ts, FoldRec ts ts, RecApplicative ts, Text ts) => ColumnTypeable (CoRec ColInfo ts) Source # 
Instance details

Defined in Frames.ColumnUniverse

type Columns = ColumnUniverse CommonColumns Source #

A universe of common column variants. These are the default column types that Frames can infer. See the Tutorial for an example of extending the default types with your own.

type ColumnUniverse = CoRec ColInfo Source #

Define a set of variants that captures all possible column types.

data ColInfo a Source #

Information necessary for synthesizing row types and comparing types.

Instances
Show a => Show (ColInfo a) Source # 
Instance details

Defined in Frames.ColumnUniverse

Methods

showsPrec :: Int -> ColInfo a -> ShowS #

show :: ColInfo a -> String #

showList :: [ColInfo a] -> ShowS #

(Text ts, RPureConstrained Parseable ts) => Semigroup (CoRec ColInfo ts) Source # 
Instance details

Defined in Frames.ColumnUniverse

Methods

(<>) :: CoRec ColInfo ts -> CoRec ColInfo ts -> CoRec ColInfo ts #

sconcat :: NonEmpty (CoRec ColInfo ts) -> CoRec ColInfo ts #

stimes :: Integral b => b -> CoRec ColInfo ts -> CoRec ColInfo ts #

(Text ts, RPureConstrained Parseable ts) => Monoid (CoRec ColInfo ts) Source # 
Instance details

Defined in Frames.ColumnUniverse

(RPureConstrained Parseable ts, FoldRec ts ts, RecApplicative ts, Text ts) => ColumnTypeable (CoRec ColInfo ts) Source # 
Instance details

Defined in Frames.ColumnUniverse

type CommonColumns = [Bool, Int, Double, Text] Source #

Common column types: Bool, Int, Double, Text

type CommonColumnsCat = [Bool, Int, Double, Categorical 8, Text] Source #

Common column types including categorical types.