first-class-families-0.8.1.0: First-class type families
Safe HaskellSafe-Inferred
LanguageHaskell2010

Fcf.Data.Symbol

Description

Symbols

Type-level strings.

Note that the operators from this module conflict with GHC.TypeLits.

Symbol also has instances of (<>) and MEmpty.

Synopsis

Type of symbols

data Symbol #

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

Instances

Instances details
TestCoercion SSymbol

Since: base-4.18.0.0

Instance details

Defined in GHC.TypeLits

Methods

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

TestEquality SSymbol

Since: base-4.18.0.0

Instance details

Defined in GHC.TypeLits

Methods

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

type MEmpty Source # 
Instance details

Defined in Fcf.Class.Monoid

type MEmpty = ""
type Compare (a :: Symbol) (b :: Symbol) 
Instance details

Defined in Data.Type.Ord

type Compare (a :: Symbol) (b :: Symbol) = CmpSymbol a b
type (x :: Symbol) <> (y :: Symbol) Source #

With base >= 4.10.0.0.

Instance details

Defined in Fcf.Class.Monoid

type (x :: Symbol) <> (y :: Symbol) = AppendSymbol x y
type Eval (Compare a b :: Ordering -> Type) Source # 
Instance details

Defined in Fcf.Class.Ord

type Eval (Compare a b :: Ordering -> Type) = CmpSymbol a b