{-# LANGUAGE NoImplicitPrelude #-}
module Data.Series.Generic (
Series(index, values),
convert,
singleton, fromIndex,
fromList, toList,
fromVector, toVector,
Occurrence, fromListDuplicates, fromVectorDuplicates,
fromStrictMap, toStrictMap,
fromLazyMap, toLazyMap,
IsSeries(..),
map, mapWithKey, mapIndex, concatMap, filter, filterWithKey,
take, takeWhile, drop, dropWhile,
mapWithKeyM, mapWithKeyM_, forWithKeyM, forWithKeyM_, traverseWithKey,
fold, foldM, foldWithKey, foldMWithKey, foldMap, foldMapWithKey,
mean, variance, std,
length, null, all, any, and, or, sum, product, maximum, maximumOn, minimum, minimumOn,
argmax, argmin,
postscanl, prescanl, forwardFill,
zipWith, zipWithMatched, zipWithKey,
zipWith3, zipWithMatched3, zipWithKey3,
ZipStrategy, skipStrategy, mapStrategy, constStrategy, zipWithStrategy, zipWithStrategy3,
zipWithMonoid, esum, eproduct, unzip, unzip3,
require, requireWith, catMaybes, dropIndex,
select, selectWhere, Range, to, from, upto, Selection,
at, iat,
replace, (|->), (<-|),
groupBy, Grouping, aggregateWith, foldWith,
windowing, expanding,
display, displayWith,
noLongerThan,
DisplayOptions(..), defaultDisplayOptions
) where
import Data.Series.Generic.Aggregation ( groupBy, Grouping, aggregateWith, foldWith
, windowing, expanding, all, any, and, or, sum, product, maximum, maximumOn, minimum, minimumOn
, argmax, argmin,
)
import Data.Series.Generic.Definition ( Series(index, values), IsSeries(..), Occurrence, convert, singleton, fromIndex, fromStrictMap
, toStrictMap, fromLazyMap, toLazyMap, fromList, fromListDuplicates, toList
, fromVector, fromVectorDuplicates, toVector
, map, mapWithKey, mapIndex, concatMap, length, null, take, takeWhile, drop, dropWhile
, mapWithKeyM, mapWithKeyM_, forWithKeyM, forWithKeyM_, traverseWithKey, fold, foldM
, foldWithKey, foldMWithKey, foldMap, foldMapWithKey
, display, displayWith, noLongerThan, DisplayOptions(..), defaultDisplayOptions
)
import Data.Series.Generic.Numeric ( mean, variance, std )
import Data.Series.Generic.Scans ( postscanl, prescanl, forwardFill )
import Data.Series.Generic.View ( Range, Selection, at, iat, select, selectWhere, to, from, upto, filter, filterWithKey, require, requireWith
, catMaybes, dropIndex,
)
import Data.Series.Generic.Zip ( zipWith, zipWithMatched, zipWithKey, zipWith3, zipWithMatched3, zipWithKey3, replace
, (|->), (<-|), zipWithStrategy, zipWithStrategy3, ZipStrategy, skipStrategy, mapStrategy, constStrategy
, zipWithMonoid, esum, eproduct, unzip, unzip3
)