| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
IntLike.Set
Synopsis
- newtype IntLikeSet x = IntLikeSet {}
- empty :: IntLikeSet x
- singleton :: Coercible x Int => x -> IntLikeSet x
- fromList :: Coercible x Int => [x] -> IntLikeSet x
- fromAscList :: Coercible x Int => [x] -> IntLikeSet x
- fromDistinctAscList :: Coercible x Int => [x] -> IntLikeSet x
- insert :: Coercible x Int => x -> IntLikeSet x -> IntLikeSet x
- delete :: Coercible x Int => x -> IntLikeSet x -> IntLikeSet x
- alterF :: (Coercible x Int, forall v u. Coercible v u => Coercible (f v) (f u), Functor f) => (Bool -> f Bool) -> x -> IntLikeSet x -> f (IntLikeSet x)
- member :: Coercible x Int => x -> IntLikeSet x -> Bool
- notMember :: Coercible x Int => x -> IntLikeSet x -> Bool
- lookupLT :: Coercible x Int => x -> IntLikeSet x -> Maybe x
- lookupGT :: Coercible x Int => x -> IntLikeSet x -> Maybe x
- lookupLE :: Coercible x Int => x -> IntLikeSet x -> Maybe x
- lookupGE :: Coercible x Int => x -> IntLikeSet x -> Maybe x
- null :: IntLikeSet x -> Bool
- size :: IntLikeSet x -> Int
- isSubsetOf :: IntLikeSet x -> IntLikeSet x -> Bool
- isProperSubsetOf :: IntLikeSet x -> IntLikeSet x -> Bool
- disjoint :: IntLikeSet x -> IntLikeSet x -> Bool
- union :: IntLikeSet x -> IntLikeSet x -> IntLikeSet x
- unions :: forall x f. (forall v u. Coercible v u => Coercible (f v) (f u), Foldable f) => f (IntLikeSet x) -> IntLikeSet x
- difference :: IntLikeSet x -> IntLikeSet x -> IntLikeSet x
- (\\) :: IntLikeSet x -> IntLikeSet x -> IntLikeSet x
- intersection :: IntLikeSet x -> IntLikeSet x -> IntLikeSet x
- filter :: Coercible x Int => (x -> Bool) -> IntLikeSet x -> IntLikeSet x
- partition :: Coercible x Int => (x -> Bool) -> IntLikeSet x -> (IntLikeSet x, IntLikeSet x)
- takeWhileAntitone :: Coercible x Int => (x -> Bool) -> IntLikeSet x -> IntLikeSet x
- dropWhileAntitone :: Coercible x Int => (x -> Bool) -> IntLikeSet x -> IntLikeSet x
- spanAntitone :: Coercible x Int => (x -> Bool) -> IntLikeSet x -> (IntLikeSet x, IntLikeSet x)
- split :: Coercible x Int => x -> IntLikeSet x -> (IntLikeSet x, IntLikeSet x)
- splitMember :: Coercible x Int => x -> IntLikeSet x -> (IntLikeSet x, Bool, IntLikeSet x)
- splitRoot :: IntLikeSet x -> [IntLikeSet x]
- map :: (Coercible x Int, Coercible y Int) => (x -> y) -> IntLikeSet x -> IntLikeSet y
- mapMonotonic :: Coercible x Int => (x -> x) -> IntLikeSet x -> IntLikeSet x
- foldr :: Coercible x Int => (x -> b -> b) -> b -> IntLikeSet x -> b
- foldl :: Coercible x Int => (a -> x -> a) -> a -> IntLikeSet x -> a
- foldr' :: Coercible x Int => (x -> b -> b) -> b -> IntLikeSet x -> b
- foldl' :: Coercible x Int => (a -> x -> a) -> a -> IntLikeSet x -> a
- fold :: Coercible x Int => (x -> b -> b) -> b -> IntLikeSet x -> b
- findMin :: Coercible x Int => IntLikeSet x -> x
- findMax :: Coercible x Int => IntLikeSet x -> x
- deleteMin :: IntLikeSet x -> IntLikeSet x
- deleteMax :: IntLikeSet x -> IntLikeSet x
- deleteFindMin :: Coercible x Int => IntLikeSet x -> (x, IntLikeSet x)
- deleteFindMax :: Coercible x Int => IntLikeSet x -> (x, IntLikeSet x)
- maxView :: Coercible x Int => IntLikeSet x -> Maybe (x, IntLikeSet x)
- minView :: Coercible x Int => IntLikeSet x -> Maybe (x, IntLikeSet x)
- elems :: Coercible x Int => IntLikeSet x -> [x]
- toList :: Coercible x Int => IntLikeSet x -> [x]
- toAscList :: Coercible x Int => IntLikeSet x -> [x]
- toDescList :: Coercible x Int => IntLikeSet x -> [x]
- insertState :: Coercible x Int => (Bool -> b) -> x -> IntLikeSet x -> (b, IntLikeSet x)
- orderedPairs :: Coercible x Int => IntLikeSet x -> [(x, x)]
- unorderedPairs :: Coercible x Int => IntLikeSet x -> [(x, x)]
Set type
newtype IntLikeSet x Source #
Constructors
| IntLikeSet | |
Fields | |
Instances
Construction
empty :: IntLikeSet x Source #
fromAscList :: Coercible x Int => [x] -> IntLikeSet x Source #
fromDistinctAscList :: Coercible x Int => [x] -> IntLikeSet x Source #
Insertion
insert :: Coercible x Int => x -> IntLikeSet x -> IntLikeSet x Source #
Deletion
delete :: Coercible x Int => x -> IntLikeSet x -> IntLikeSet x Source #
Generalized insertion/deletion
alterF :: (Coercible x Int, forall v u. Coercible v u => Coercible (f v) (f u), Functor f) => (Bool -> f Bool) -> x -> IntLikeSet x -> f (IntLikeSet x) Source #
Query
null :: IntLikeSet x -> Bool Source #
size :: IntLikeSet x -> Int Source #
isSubsetOf :: IntLikeSet x -> IntLikeSet x -> Bool Source #
isProperSubsetOf :: IntLikeSet x -> IntLikeSet x -> Bool Source #
disjoint :: IntLikeSet x -> IntLikeSet x -> Bool Source #
Combine
union :: IntLikeSet x -> IntLikeSet x -> IntLikeSet x Source #
unions :: forall x f. (forall v u. Coercible v u => Coercible (f v) (f u), Foldable f) => f (IntLikeSet x) -> IntLikeSet x Source #
difference :: IntLikeSet x -> IntLikeSet x -> IntLikeSet x Source #
(\\) :: IntLikeSet x -> IntLikeSet x -> IntLikeSet x Source #
intersection :: IntLikeSet x -> IntLikeSet x -> IntLikeSet x Source #
Filter
filter :: Coercible x Int => (x -> Bool) -> IntLikeSet x -> IntLikeSet x Source #
partition :: Coercible x Int => (x -> Bool) -> IntLikeSet x -> (IntLikeSet x, IntLikeSet x) Source #
takeWhileAntitone :: Coercible x Int => (x -> Bool) -> IntLikeSet x -> IntLikeSet x Source #
dropWhileAntitone :: Coercible x Int => (x -> Bool) -> IntLikeSet x -> IntLikeSet x Source #
spanAntitone :: Coercible x Int => (x -> Bool) -> IntLikeSet x -> (IntLikeSet x, IntLikeSet x) Source #
split :: Coercible x Int => x -> IntLikeSet x -> (IntLikeSet x, IntLikeSet x) Source #
splitMember :: Coercible x Int => x -> IntLikeSet x -> (IntLikeSet x, Bool, IntLikeSet x) Source #
splitRoot :: IntLikeSet x -> [IntLikeSet x] Source #
Map
map :: (Coercible x Int, Coercible y Int) => (x -> y) -> IntLikeSet x -> IntLikeSet y Source #
mapMonotonic :: Coercible x Int => (x -> x) -> IntLikeSet x -> IntLikeSet x Source #
Folds
Strict folds
Legacy folds
Min/Max
deleteMin :: IntLikeSet x -> IntLikeSet x Source #
deleteMax :: IntLikeSet x -> IntLikeSet x Source #
deleteFindMin :: Coercible x Int => IntLikeSet x -> (x, IntLikeSet x) Source #
deleteFindMax :: Coercible x Int => IntLikeSet x -> (x, IntLikeSet x) Source #
maxView :: Coercible x Int => IntLikeSet x -> Maybe (x, IntLikeSet x) Source #
minView :: Coercible x Int => IntLikeSet x -> Maybe (x, IntLikeSet x) Source #
Conversion
List
toDescList :: Coercible x Int => IntLikeSet x -> [x] Source #
Extra
insertState :: Coercible x Int => (Bool -> b) -> x -> IntLikeSet x -> (b, IntLikeSet x) Source #
orderedPairs :: Coercible x Int => IntLikeSet x -> [(x, x)] Source #
unorderedPairs :: Coercible x Int => IntLikeSet x -> [(x, x)] Source #