mps-2010.1.24.1: simply oo

MPS.Light

Documentation

(.) :: a -> (a -> b) -> bSource

(>) :: Category cat => cat a b -> cat b c -> cat a cSource

(<) :: Category cat => cat b c -> cat a b -> cat a cSource

(^) :: Functor f => f a -> (a -> b) -> f bSource

(-) :: (a -> b) -> a -> bSource

(<->) :: Num a => a -> a -> aSource

join :: [a] -> [[a]] -> [a]Source

join' :: [[a]] -> [a]Source

second :: [a] -> aSource

third :: [a] -> aSource

forth :: [a] -> aSource

fifth :: [a] -> aSource

first :: [a] -> aSource

seventh :: [a] -> aSource

eighth :: [a] -> aSource

ninth :: [a] -> aSource

tenth :: [a] -> aSource

sixth :: [a] -> aSource

unique :: Ord a => [a] -> [a]Source

is_unique :: Ord a => [a] -> BoolSource

same :: Ord a => [a] -> BoolSource

times :: b -> Int -> [b]Source

upto :: Enum a => a -> a -> [a]Source

downto :: (Num t, Enum t) => t -> t -> [t]Source

remove_at :: Int -> [a] -> [a]Source

replace_at :: Int -> a -> [a] -> [a]Source

insert_at :: Int -> a -> [a] -> [a]Source

at :: Int -> [a] -> aSource

slice :: Int -> Int -> [a] -> [a]Source

cherry_pick :: [Int] -> [a] -> [a]Source

reduce' :: (a -> a -> a) -> [a] -> aSource

reduce :: (a -> a -> a) -> [a] -> aSource

inject' :: Foldable t => a -> (a -> b -> a) -> t b -> aSource

inject :: Foldable t => a -> (a -> b -> a) -> t b -> aSource

none_of :: (a -> Bool) -> [a] -> BoolSource

reject :: (a -> Bool) -> [a] -> [a]Source

select :: (a -> Bool) -> [a] -> [a]Source

inner_map :: (a -> b) -> [[a]] -> [[b]]Source

inner_reduce :: (a -> a -> a) -> [[a]] -> [a]Source

inner_inject :: Foldable t => a -> (a -> b -> a) -> [t b] -> [a]Source

label_by :: (a -> c) -> [a] -> [(c, a)]Source

labeling :: (a -> c') -> [a] -> [(a, c')]Source

in_group_of :: Int -> [t] -> [[t]]Source

split_to :: Int -> [a] -> [[a]]Source

send_to :: a -> (a -> b) -> bSource

apply :: a -> (a -> b) -> bSource

let_receive :: (a -> b -> c) -> b -> a -> cSource

map_send_to :: a -> [a -> b] -> [b]Source

belongs_to :: (Foldable t, Eq a) => t a -> a -> BoolSource

has :: (Foldable t, Eq b) => b -> t b -> BoolSource

indexed :: (Num t, Enum t) => [b] -> [(t, b)]Source

map_with_index :: (Num t, Enum t) => ((t, b) -> b1) -> [b] -> [b1]Source

rjust :: Int -> a -> [a] -> [a]Source

ljust :: Int -> a -> [a] -> [a]Source

lb :: (a -> Bool) -> [a] -> [a]Source

ub :: (a -> Bool) -> [a] -> [a]Source

between :: (a -> Bool) -> (a -> Bool) -> [a] -> [a]Source

powerslice :: [a] -> [[a]]Source

common :: Ord a => [a] -> [a] -> [a]Source

rsort :: Ord a => [a] -> [a]Source

encode :: Eq a => [a] -> [(Int, a)]Source

decode :: [(Int, a)] -> [a]Source

concat_map :: (a -> [b]) -> [a] -> [b]Source

to_list :: Foldable t => t a -> [a]Source

to_set :: Ord a => [a] -> Set aSource

to_h :: Ord k => [(k, a)] -> Map k aSource

to_a :: [a] -> Array Int aSource

to_a' :: Ix i => (i, i) -> [e] -> Array i eSource

hist :: (Num e, Ix i) => (i, i) -> [i] -> Array i eSource

compare_by :: Ord b => (a -> b) -> a -> a -> OrderingSource

is :: Eq a => a -> a -> BoolSource

is_not :: Eq a => a -> a -> BoolSource

isn't :: Eq a => a -> a -> BoolSource

aren't :: Eq a => a -> a -> BoolSource

eq :: Eq a => a -> a -> BoolSource

swap :: (a, b) -> (b, a)Source

tuple2 :: [a] -> (a, a)Source

tuple3 :: [a] -> (a, a, a)Source

list2 :: (a, a) -> [a]Source

list3 :: (a, a, a) -> [a]Source

filter_fst :: (a -> Bool) -> [(a, b)] -> [(a, b)]Source

filter_snd :: (b -> Bool) -> [(a, b)] -> [(a, b)]Source

only_fst :: [(a, b)] -> [a]Source

only_snd :: [(a, b)] -> [b]Source

map_fst :: (a -> b) -> [(a, c)] -> [(b, c)]Source

map_snd :: (a -> b) -> [(c, a)] -> [(c, b)]Source

pair :: ((a, b) -> c) -> a -> b -> cSource

triple :: ((a, b, c) -> d) -> a -> b -> c -> dSource

splash :: (a -> b -> c) -> (a, b) -> cSource

splash3 :: (a -> b -> c -> d) -> (a, b, c) -> dSource

twin :: a -> (a, a)Source

from_i :: (Integral a, Num b) => a -> bSource

explode :: Show a => a -> [Int]Source

to_s :: Show a => a -> StringSource

is_palindrom :: Eq a => [a] -> BoolSource

trace' :: Show a => a -> aSource