histogram-fill-0.9.0.0: Library for histograms creation.

Safe HaskellNone
LanguageHaskell98

Data.Histogram.Bin.BinI

Synopsis

Documentation

data BinI Source #

Very simple binning algorithm. Each indices. Each number correcsponds to different bin.

For rountripping use lowerLimit and upperLimit

b = binI (lowerLimit b) (upperLimit b)

Instances

Eq BinI Source # 

Methods

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

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

Data BinI Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BinI -> c BinI #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BinI #

toConstr :: BinI -> Constr #

dataTypeOf :: BinI -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c BinI) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BinI) #

gmapT :: (forall b. Data b => b -> b) -> BinI -> BinI #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BinI -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BinI -> r #

gmapQ :: (forall d. Data d => d -> u) -> BinI -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BinI -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BinI -> m BinI #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BinI -> m BinI #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BinI -> m BinI #

Read BinI Source # 
Show BinI Source # 

Methods

showsPrec :: Int -> BinI -> ShowS #

show :: BinI -> String #

showList :: [BinI] -> ShowS #

NFData BinI Source # 

Methods

rnf :: BinI -> () #

UniformBin BinI Source # 
VariableBin BinI Source # 
SliceableBin BinI Source # 

Methods

unsafeSliceBin :: Int -> Int -> BinI -> BinI Source #

Bin1D BinI Source # 
IntervalBin BinI Source # 
BinEq BinI Source # 

Methods

binEq :: BinI -> BinI -> Bool Source #

Bin BinI Source # 
Read BinI => Read (BinPermute BinI) # 
type BinValue BinI Source # 

binI Source #

Arguments

:: Int

Lower bound (inclusive)

-> Int

Upper bound (inclusive)

-> BinI 

Safe constructor for BinI. It checks that upper bound is greater or equal than lower bound

binI0 Source #

Arguments

:: Int

Number of bins.

-> BinI 

Construct BinI with n bins. Indexing starts from 0. n must be positive