clash-prelude-1.4.1: Clash: a functional hardware description language - Prelude library
Copyright(C) 2013-2016 University of Twente
LicenseBSD2 (see the file LICENSE)
MaintainerChristiaan Baaij <christiaan.baaij@gmail.com>
Safe HaskellSafe
LanguageHaskell2010
Extensions
  • Cpp
  • MonoLocalBinds
  • TemplateHaskellQuotes
  • ScopedTypeVariables
  • BangPatterns
  • ViewPatterns
  • GADTs
  • GADTSyntax
  • DataKinds
  • InstanceSigs
  • StandaloneDeriving
  • DeriveDataTypeable
  • DeriveFunctor
  • DeriveTraversable
  • DeriveFoldable
  • DeriveGeneric
  • DefaultSignatures
  • DeriveLift
  • DerivingStrategies
  • MagicHash
  • KindSignatures
  • TupleSections
  • TypeOperators
  • ExplicitNamespaces
  • ExplicitForAll
  • BinaryLiterals
  • TypeApplications

Clash.Promoted.Symbol

Description

 
Synopsis

Documentation

data SSymbol (s :: Symbol) where Source #

Singleton value for a type-level string s

Constructors

SSymbol :: KnownSymbol s => SSymbol s 

Instances

Instances details
KnownSymbol s => Lift (SSymbol s :: Type) Source # 
Instance details

Defined in Clash.Promoted.Symbol

Methods

lift :: SSymbol s -> Q Exp #

liftTyped :: SSymbol s -> Q (TExp (SSymbol s)) #

Show (SSymbol s) Source # 
Instance details

Defined in Clash.Promoted.Symbol

Methods

showsPrec :: Int -> SSymbol s -> ShowS #

show :: SSymbol s -> String #

showList :: [SSymbol s] -> ShowS #

ssymbolProxy :: KnownSymbol s => proxy s -> SSymbol s Source #

Create a singleton symbol literal SSymbol s from a proxy for s

ssymbolToString :: SSymbol s -> String Source #

Reify the type-level Symbol s to it's term-level String representation.