base-4.20.0.0: Core data structures and operations
Copyright(c) The University of Glasgow 1994-2000
Licensesee libraries/base/LICENSE
Maintainerghc-devs@haskell.org
Stabilityinternal
Portabilitynon-portable (GHC extensions)
Safe HaskellSafe
LanguageHaskell2010

GHC.TypeLits.Internal

Description

Do not use this module. Use GHC.TypeLits instead.

This module is internal-only and was exposed by accident. It may be removed without warning in a future version.

The API of this module is unstable and is tightly coupled to GHC's internals. If depend on it, make sure to use a tight upper bound, e.g., base < 4.X rather than base < 5, because the interface can change rapidly without much warning.

The technical reason for this module's existence is that it is needed to prevent module cycles while still allowing these identifiers to be imported in Data.Type.Ord.

Since: base-4.16.0.0

Synopsis

Documentation

data Symbol Source #

(Kind) This is the kind of type-level symbols.

Instances

Instances details
SingKind Symbol

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Associated Types

type DemoteRep Symbol 
Instance details

Defined in GHC.Internal.Generics

type DemoteRep Symbol = String

Methods

fromSing :: forall (a :: Symbol). Sing a -> DemoteRep Symbol

TestCoercion SSymbol

@since base-4.18.0.0

Instance details

Defined in GHC.Internal.TypeLits

Methods

testCoercion :: forall (a :: Symbol) (b :: Symbol). SSymbol a -> SSymbol b -> Maybe (Coercion a b) Source #

TestEquality SSymbol

@since base-4.18.0.0

Instance details

Defined in GHC.Internal.TypeLits

Methods

testEquality :: forall (a :: Symbol) (b :: Symbol). SSymbol a -> SSymbol b -> Maybe (a :~: b) Source #

KnownSymbol a => SingI (a :: Symbol)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

sing :: Sing a

type DemoteRep Symbol 
Instance details

Defined in GHC.Internal.Generics

type DemoteRep Symbol = String
data Sing (s :: Symbol) 
Instance details

Defined in GHC.Internal.Generics

data Sing (s :: Symbol) where
type Compare (a :: Symbol) (b :: Symbol) 
Instance details

Defined in GHC.Internal.Data.Type.Ord

type Compare (a :: Symbol) (b :: Symbol) = CmpSymbol a b

type family CmpSymbol (a :: Symbol) (b :: Symbol) :: Ordering where ... Source #

Comparison of type-level symbols, as a function.

@since base-4.7.0.0

type family CmpChar (a :: Char) (b :: Char) :: Ordering where ... Source #

Comparison of type-level characters.

@since base-4.16.0.0