{-# OPTIONS_GHC -Wno-orphans #-}
module Data.Vector.Algorithms.Quicksort.Predefined.UTupleSequentialMedian3ST
( sortUTupleSequentialMedian3ST
) where
import Control.Monad.ST
import Data.Int
import Data.Vector.Unboxed qualified as U
import Data.Vector.Algorithms.Quicksort.Parameterised
import Data.Vector.Algorithms.FixedSort
import Data.Vector.Algorithms.Heapsort
{-# SPECIALIZE heapSort :: U.MVector s (Int32, Int32) -> ST s () #-}
{-# SPECIALIZE bitonicSort :: Int -> U.MVector s (Int32, Int32) -> ST s () #-}
{-# NOINLINE sortUTupleSequentialMedian3ST #-}
sortUTupleSequentialMedian3ST :: U.MVector s (Int32, Int32) -> ST s ()
sortUTupleSequentialMedian3ST :: forall s. MVector s (Int32, Int32) -> ST s ()
sortUTupleSequentialMedian3ST = forall p med x (m :: * -> *) a (v :: * -> * -> *).
(Fork2 p x m, Median med a m (PrimState m), PrimMonad m, Ord a,
MVector v a) =>
p -> med -> v (PrimState m) a -> m ()
sortInplaceFM Sequential
Sequential (forall {k} (a :: k). Median3 a
Median3 @(Int32, Int32))