{-# options_ghc -Wno-unused-imports #-}
module Heidi (
Frame
, encode, Heidi, TC, VP
, frameFromList
, head, take, drop, numRows
, filter, filterA
, groupWith
, zipWith
, scanl, scanr
, spreadWith, gatherWith
, groupBy, innerJoin, leftOuterJoin
, toVector, fromVector
, Row
, rowFromList
, toList, keys
, delete, filterWithKey, filterWithKeyPrefix, filterWithKeyAny
, deleteMany
, partitionWithKey, partitionWithKeyPrefix
, lookup
, (!:), elemSatisfies
, maybeEmpty
, eqByLookup, eqByLookups
, compareByLookup
, union, unionWith
, intersection, intersectionWith
, mapWithKey
, foldWithKey, keysOnly
, traverseWithKey
, int, bool, float, double, char, string, text, scientific, oneHot
, at, keep
, atPrefix, eachPrefixed, foldPrefixed
, tcTyN, tcTyCon, mkTyN, mkTyCon
)
where
import Control.Monad.Catch (MonadThrow(..))
import Core.Data.Frame.List (Frame, frameFromList, head, take, drop, zipWith, numRows, filter, filterA, groupWith, scanl, scanr, toVector, fromVector)
import Core.Data.Frame.Generic (encode)
import Data.Generics.Encode.Internal (Heidi, VP(..))
import Data.Generics.Codec (TC(..), tcTyN, tcTyCon, mkTyN, mkTyCon, TypeError(..))
import Heidi.Data.Row.GenericTrie
import Heidi.Data.Frame.Algorithms.GenericTrie (innerJoin, leftOuterJoin, gatherWith, spreadWith, groupBy)
import Prelude hiding (filter, zipWith, lookup, foldl, foldr, scanl, scanr, head, take, drop)