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

Safe HaskellNone
LanguageHaskell2010

Frames.Exploration

Description

Functions useful for interactively exploring and experimenting with a data set.

Synopsis

Documentation

pipePreview :: (MonadIO m, Show b) => Producer a m () -> Int -> Pipe a b m () -> m () Source

preview src n f prints out the first n results of piping src through f.

select :: fs rs => proxy fs -> Record rs -> Record fs Source

select (Proxy::Proxy [A,B,C]) extracts columns A, B, and C, from a larger record. Note, this is just a way of pinning down the type of a usage of rcast.

lenses :: (fs rs, Functor f) => proxy fs -> (Record fs -> f (Record fs)) -> Record rs -> f (Record rs) Source

lenses (Proxy::Proxy [A,B,C]) provides a lens onto columns A, B, and C. This is just a way of pinning down the type of rsubset.

recToList :: (AsVinyl rs, AllAre a (UnColumn rs)) => Record rs -> [a] Source

pr :: QuasiQuoter Source

A proxy value quasiquoter. [pr|T|] will splice an expression Proxy::Proxy T, while [pr|A,B,C|] will splice in a value of Proxy :: Proxy [A,B,C].

pr1 :: QuasiQuoter Source

Like pr, but takes a single type, which is used to produce a Proxy for a single-element list containing only that type. This is useful for passing a single type to a function that wants a list of types.