module Data.Vector.Algorithms.Quicksort.Predefined.PTripleSequentialMedian3or5ST
  ( sortPTripleSequentialMedian3or5ST
  ) where
import Control.Monad.ST
import Data.Vector.Primitive qualified as P
import Data.Vector.Algorithms.Quicksort.Parameterised
import Data.Vector.Algorithms.Quicksort.Predefined.SortTriple
import Data.Vector.Algorithms.Quicksort.Predefined.PTripleSequentialMedian3ST ()
{-# NOINLINE sortPTripleSequentialMedian3or5ST #-}
sortPTripleSequentialMedian3or5ST :: P.MVector s SortTriple -> ST s ()
sortPTripleSequentialMedian3or5ST :: forall s. MVector s SortTriple -> ST s ()
sortPTripleSequentialMedian3or5ST = Sequential
-> Median3or5 SortTriple
-> MVector (PrimState (ST s)) SortTriple
-> ST s ()
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 a. Median3or5 a
forall {k} (a :: k). Median3or5 a
Median3or5 @SortTriple)