{-# LANGUAGE TemplateHaskell, ScopedTypeVariables, TypeFamilies,
UndecidableInstances, GADTs, DataKinds, PolyKinds,
TypeApplications, StandaloneKindSignatures #-}
module Data.Singletons.Prelude.List.Internal.Disambiguation where
import Data.Singletons.Single
import Data.Singletons.Prelude.Base
import Data.Singletons.Prelude.Instances
import Data.Singletons.Prelude.List.Internal
import Data.Singletons.Prelude.Num
import Data.Singletons.Prelude.Ord
import Data.Singletons.Prelude.Eq
import Data.List ( foldl', inits, insert, intersperse, isPrefixOf
, nubBy, partition, sort, sortBy, tails, transpose )
import GHC.TypeLits
$(