{- Data/Singletons/Instances.hs (c) Richard Eisenberg 2013 rae@cs.brynmawr.edu This (internal) module contains the main class definitions for singletons, re-exported from various places. -} {-# LANGUAGE DataKinds, PolyKinds, RankNTypes, GADTs, TypeFamilies, EmptyCase, FlexibleContexts, TemplateHaskell, ScopedTypeVariables, UndecidableInstances, TypeOperators, FlexibleInstances, TypeApplications, StandaloneKindSignatures #-} {-# OPTIONS_GHC -Wno-orphans #-} module Data.Singletons.Prelude.Instances ( module Data.Singletons.Prelude.Instances , Sing ) where import Data.Singletons.Internal import Data.Singletons.Single import Data.Singletons.Util -- some useful singletons $(