vector-quicksort-0.2: Fast and flexible quicksort implementation for mutable vectors
Copyright(c) Sergey Vinokurov 2023
LicenseApache-2.0 (see LICENSE)
Maintainerserg.foo@gmail.com
Safe HaskellSafe-Inferred
LanguageGHC2021

Data.Vector.Algorithms.Quicksort.Predefined.Pair

Description

 

Documentation

data TestPair a b Source #

Constructors

TestPair a b 

Instances

Instances details
(Unbox a, Unbox b) => Vector Vector (TestPair a b) Source # 
Instance details

Defined in Data.Vector.Algorithms.Quicksort.Predefined.Pair

Methods

basicUnsafeFreeze :: Mutable Vector s (TestPair a b) -> ST s (Vector (TestPair a b))

basicUnsafeThaw :: Vector (TestPair a b) -> ST s (Mutable Vector s (TestPair a b))

basicLength :: Vector (TestPair a b) -> Int

basicUnsafeSlice :: Int -> Int -> Vector (TestPair a b) -> Vector (TestPair a b)

basicUnsafeIndexM :: Vector (TestPair a b) -> Int -> Box (TestPair a b)

basicUnsafeCopy :: Mutable Vector s (TestPair a b) -> Vector (TestPair a b) -> ST s ()

elemseq :: Vector (TestPair a b) -> TestPair a b -> b0 -> b0

(Unbox a, Unbox b) => MVector MVector (TestPair a b) Source # 
Instance details

Defined in Data.Vector.Algorithms.Quicksort.Predefined.Pair

Methods

basicLength :: MVector s (TestPair a b) -> Int

basicUnsafeSlice :: Int -> Int -> MVector s (TestPair a b) -> MVector s (TestPair a b)

basicOverlaps :: MVector s (TestPair a b) -> MVector s (TestPair a b) -> Bool

basicUnsafeNew :: Int -> ST s (MVector s (TestPair a b))

basicInitialize :: MVector s (TestPair a b) -> ST s ()

basicUnsafeReplicate :: Int -> TestPair a b -> ST s (MVector s (TestPair a b))

basicUnsafeRead :: MVector s (TestPair a b) -> Int -> ST s (TestPair a b)

basicUnsafeWrite :: MVector s (TestPair a b) -> Int -> TestPair a b -> ST s ()

basicClear :: MVector s (TestPair a b) -> ST s ()

basicSet :: MVector s (TestPair a b) -> TestPair a b -> ST s ()

basicUnsafeCopy :: MVector s (TestPair a b) -> MVector s (TestPair a b) -> ST s ()

basicUnsafeMove :: MVector s (TestPair a b) -> MVector s (TestPair a b) -> ST s ()

basicUnsafeGrow :: MVector s (TestPair a b) -> Int -> ST s (MVector s (TestPair a b))

(Show a, Show b) => Show (TestPair a b) Source # 
Instance details

Defined in Data.Vector.Algorithms.Quicksort.Predefined.Pair

Methods

showsPrec :: Int -> TestPair a b -> ShowS #

show :: TestPair a b -> String #

showList :: [TestPair a b] -> ShowS #

Eq a => Eq (TestPair a b) Source # 
Instance details

Defined in Data.Vector.Algorithms.Quicksort.Predefined.Pair

Methods

(==) :: TestPair a b -> TestPair a b -> Bool #

(/=) :: TestPair a b -> TestPair a b -> Bool #

Ord a => Ord (TestPair a b) Source # 
Instance details

Defined in Data.Vector.Algorithms.Quicksort.Predefined.Pair

Methods

compare :: TestPair a b -> TestPair a b -> Ordering #

(<) :: TestPair a b -> TestPair a b -> Bool #

(<=) :: TestPair a b -> TestPair a b -> Bool #

(>) :: TestPair a b -> TestPair a b -> Bool #

(>=) :: TestPair a b -> TestPair a b -> Bool #

max :: TestPair a b -> TestPair a b -> TestPair a b #

min :: TestPair a b -> TestPair a b -> TestPair a b #

(Unbox a, Unbox b) => Unbox (TestPair a b) Source # 
Instance details

Defined in Data.Vector.Algorithms.Quicksort.Predefined.Pair

IsoUnbox (TestPair a b) (a, b) Source # 
Instance details

Defined in Data.Vector.Algorithms.Quicksort.Predefined.Pair

Methods

toURepr :: TestPair a b -> (a, b)

fromURepr :: (a, b) -> TestPair a b

newtype MVector s (TestPair a b) Source # 
Instance details

Defined in Data.Vector.Algorithms.Quicksort.Predefined.Pair

newtype MVector s (TestPair a b) = MV_TestPair (MVector s (a, b))
newtype Vector (TestPair a b) Source # 
Instance details

Defined in Data.Vector.Algorithms.Quicksort.Predefined.Pair

newtype Vector (TestPair a b) = V_TestPair (Vector (a, b))

toTuple :: TestPair a b -> (a, b) Source #