module StreamPatch.Patch.Linearize.Common where

import StreamPatch.Patch

comparePatchSeeks :: Ord s => Patch s fs a -> Patch s fs a -> Ordering
comparePatchSeeks :: forall s (fs :: [* -> *]) a.
Ord s =>
Patch s fs a -> Patch s fs a -> Ordering
comparePatchSeeks Patch s fs a
p1 Patch s fs a
p2 = s -> s -> Ordering
forall a. Ord a => a -> a -> Ordering
compare (Patch s fs a -> s
forall s (fs :: [* -> *]) a. Patch s fs a -> s
patchSeek Patch s fs a
p1) (Patch s fs a -> s
forall s (fs :: [* -> *]) a. Patch s fs a -> s
patchSeek Patch s fs a
p2)