{-# LANGUAGE TemplateHaskell, ScopedTypeVariables, TypeFamilies,
UndecidableInstances, GADTs, DataKinds, PolyKinds,
TypeApplications #-}
{-# OPTIONS_GHC -Wno-missing-signatures #-}
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
import GHC.TypeLits
$(