{-# LANGUAGE OverloadedStrings #-}
module Typst.Symbols (
  typstSymbols
)
where
import Data.Text (Text)

-- | A list of triples, each consisting of the symbol name,
-- a Boolean indicating whether the symbol is an accent, and
-- the resolved symbol.
typstSymbols :: [(Text, Bool, Text)]
typstSymbols :: [(Text, Bool, Text)]
typstSymbols =
-- autogenerated by make update-symbols
  [ ( Text
"wj" , Bool
False , Text
"\8288" )
  , ( Text
"zwj" , Bool
False , Text
"\8205" )
  , ( Text
"zwnj" , Bool
False , Text
"\8204" )
  , ( Text
"zws" , Bool
False , Text
"\8203" )
  , ( Text
"lrm" , Bool
False , Text
"\8206" )
  , ( Text
"rlm" , Bool
False , Text
"\8207" )
  , ( Text
"space" , Bool
False , Text
" " )
  , ( Text
"space.nobreak" , Bool
False , Text
"\160" )
  , ( Text
"space.nobreak.narrow" , Bool
False , Text
"\8239" )
  , ( Text
"space.en" , Bool
False , Text
"\8194" )
  , ( Text
"space.quad" , Bool
False , Text
"\8195" )
  , ( Text
"space.third" , Bool
False , Text
"\8196" )
  , ( Text
"space.quarter" , Bool
False , Text
"\8197" )
  , ( Text
"space.sixth" , Bool
False , Text
"\8198" )
  , ( Text
"space.med" , Bool
False , Text
"\8287" )
  , ( Text
"space.fig" , Bool
False , Text
"\8199" )
  , ( Text
"space.punct" , Bool
False , Text
"\8200" )
  , ( Text
"space.thin" , Bool
False , Text
"\8201" )
  , ( Text
"space.hair" , Bool
False , Text
"\8202" )
  , ( Text
"paren.l" , Bool
False , Text
"(" )
  , ( Text
"paren.r" , Bool
False , Text
")" )
  , ( Text
"paren.t" , Bool
False , Text
"\9180" )
  , ( Text
"paren.b" , Bool
False , Text
"\9181" )
  , ( Text
"brace.l" , Bool
False , Text
"{" )
  , ( Text
"brace.r" , Bool
False , Text
"}" )
  , ( Text
"brace.t" , Bool
False , Text
"\9182" )
  , ( Text
"brace.b" , Bool
False , Text
"\9183" )
  , ( Text
"bracket.l" , Bool
False , Text
"[" )
  , ( Text
"bracket.l.double" , Bool
False , Text
"\10214" )
  , ( Text
"bracket.r" , Bool
False , Text
"]" )
  , ( Text
"bracket.r.double" , Bool
False , Text
"\10215" )
  , ( Text
"bracket.t" , Bool
False , Text
"\9140" )
  , ( Text
"bracket.b" , Bool
False , Text
"\9141" )
  , ( Text
"turtle.l" , Bool
False , Text
"\12308" )
  , ( Text
"turtle.r" , Bool
False , Text
"\12309" )
  , ( Text
"turtle.t" , Bool
False , Text
"\9184" )
  , ( Text
"turtle.b" , Bool
False , Text
"\9185" )
  , ( Text
"bar.v" , Bool
False , Text
"|" )
  , ( Text
"bar.v.double" , Bool
False , Text
"\8214" )
  , ( Text
"bar.v.triple" , Bool
False , Text
"\10624" )
  , ( Text
"bar.v.broken" , Bool
False , Text
"\166" )
  , ( Text
"bar.v.circle" , Bool
False , Text
"\10678" )
  , ( Text
"bar.h" , Bool
False , Text
"\8213" )
  , ( Text
"fence.l" , Bool
False , Text
"\10712" )
  , ( Text
"fence.l.double" , Bool
False , Text
"\10714" )
  , ( Text
"fence.r" , Bool
False , Text
"\10713" )
  , ( Text
"fence.r.double" , Bool
False , Text
"\10715" )
  , ( Text
"fence.dotted" , Bool
False , Text
"\10649" )
  , ( Text
"angle" , Bool
False , Text
"\8736" )
  , ( Text
"angle.l" , Bool
False , Text
"\10216" )
  , ( Text
"angle.r" , Bool
False , Text
"\10217" )
  , ( Text
"angle.l.double" , Bool
False , Text
"\12298" )
  , ( Text
"angle.r.double" , Bool
False , Text
"\12299" )
  , ( Text
"angle.acute" , Bool
False , Text
"\10655" )
  , ( Text
"angle.arc" , Bool
False , Text
"\8737" )
  , ( Text
"angle.arc.rev" , Bool
False , Text
"\10651" )
  , ( Text
"angle.rev" , Bool
False , Text
"\10659" )
  , ( Text
"angle.right" , Bool
False , Text
"\8735" )
  , ( Text
"angle.right.rev" , Bool
False , Text
"\11262" )
  , ( Text
"angle.right.arc" , Bool
False , Text
"\8894" )
  , ( Text
"angle.right.dot" , Bool
False , Text
"\10653" )
  , ( Text
"angle.right.sq" , Bool
False , Text
"\10652" )
  , ( Text
"angle.spatial" , Bool
False , Text
"\10176" )
  , ( Text
"angle.spheric" , Bool
False , Text
"\8738" )
  , ( Text
"angle.spheric.rev" , Bool
False , Text
"\10656" )
  , ( Text
"angle.spheric.top" , Bool
False , Text
"\10657" )
  , ( Text
"amp" , Bool
False , Text
"&" )
  , ( Text
"amp.inv" , Bool
False , Text
"\8523" )
  , ( Text
"ast.op" , Bool
False , Text
"\8727" )
  , ( Text
"ast.basic" , Bool
False , Text
"*" )
  , ( Text
"ast.low" , Bool
False , Text
"\8270" )
  , ( Text
"ast.double" , Bool
False , Text
"\8273" )
  , ( Text
"ast.triple" , Bool
False , Text
"\8258" )
  , ( Text
"ast.small" , Bool
False , Text
"\65121" )
  , ( Text
"ast.circle" , Bool
False , Text
"\8859" )
  , ( Text
"ast.square" , Bool
False , Text
"\10694" )
  , ( Text
"at" , Bool
False , Text
"@" )
  , ( Text
"backslash" , Bool
False , Text
"\\" )
  , ( Text
"backslash.circle" , Bool
False , Text
"\10680" )
  , ( Text
"backslash.not" , Bool
False , Text
"\10743" )
  , ( Text
"co" , Bool
False , Text
"\8453" )
  , ( Text
"colon" , Bool
False , Text
":" )
  , ( Text
"colon.double" , Bool
False , Text
"\8759" )
  , ( Text
"colon.eq" , Bool
False , Text
"\8788" )
  , ( Text
"colon.double.eq" , Bool
False , Text
"\10868" )
  , ( Text
"comma" , Bool
False , Text
"," )
  , ( Text
"dagger" , Bool
False , Text
"\8224" )
  , ( Text
"dagger.double" , Bool
False , Text
"\8225" )
  , ( Text
"dash.en" , Bool
False , Text
"\8211" )
  , ( Text
"dash.em" , Bool
False , Text
"\8212" )
  , ( Text
"dash.fig" , Bool
False , Text
"\8210" )
  , ( Text
"dash.wave" , Bool
False , Text
"\12316" )
  , ( Text
"dash.colon" , Bool
False , Text
"\8761" )
  , ( Text
"dash.circle" , Bool
False , Text
"\8861" )
  , ( Text
"dash.wave.double" , Bool
False , Text
"\12336" )
  , ( Text
"dot.op" , Bool
True , Text
"\8901" )
  , ( Text
"dot.basic" , Bool
True , Text
"." )
  , ( Text
"dot.c" , Bool
False , Text
"\183" )
  , ( Text
"dot.circle" , Bool
False , Text
"\8857" )
  , ( Text
"dot.circle.big" , Bool
False , Text
"\10752" )
  , ( Text
"dot.square" , Bool
False , Text
"\8865" )
  , ( Text
"dot.double" , Bool
True , Text
"\168" )
  , ( Text
"dot.triple" , Bool
True , Text
"\8411" )
  , ( Text
"dot.quad" , Bool
True , Text
"\8412" )
  , ( Text
"excl" , Bool
False , Text
"!" )
  , ( Text
"excl.double" , Bool
False , Text
"\8252" )
  , ( Text
"excl.inv" , Bool
False , Text
"\161" )
  , ( Text
"excl.quest" , Bool
False , Text
"\8265" )
  , ( Text
"quest" , Bool
False , Text
"?" )
  , ( Text
"quest.double" , Bool
False , Text
"\8263" )
  , ( Text
"quest.excl" , Bool
False , Text
"\8264" )
  , ( Text
"quest.inv" , Bool
False , Text
"\191" )
  , ( Text
"interrobang" , Bool
False , Text
"\8253" )
  , ( Text
"hash" , Bool
False , Text
"#" )
  , ( Text
"hyph" , Bool
False , Text
"\8208" )
  , ( Text
"hyph.minus" , Bool
True , Text
"-" )
  , ( Text
"hyph.nobreak" , Bool
False , Text
"\8209" )
  , ( Text
"hyph.point" , Bool
False , Text
"\8231" )
  , ( Text
"hyph.soft" , Bool
False , Text
"\173" )
  , ( Text
"percent" , Bool
False , Text
"%" )
  , ( Text
"copyright" , Bool
False , Text
"\169" )
  , ( Text
"copyright.sound" , Bool
False , Text
"\8471" )
  , ( Text
"permille" , Bool
False , Text
"\8240" )
  , ( Text
"pilcrow" , Bool
False , Text
"\182" )
  , ( Text
"pilcrow.rev" , Bool
False , Text
"\8267" )
  , ( Text
"section" , Bool
False , Text
"\167" )
  , ( Text
"semi" , Bool
False , Text
";" )
  , ( Text
"semi.rev" , Bool
False , Text
"\8271" )
  , ( Text
"slash" , Bool
False , Text
"/" )
  , ( Text
"slash.double" , Bool
False , Text
"\11005" )
  , ( Text
"slash.triple" , Bool
False , Text
"\11003" )
  , ( Text
"slash.big" , Bool
False , Text
"\10744" )
  , ( Text
"dots.h.c" , Bool
False , Text
"\8943" )
  , ( Text
"dots.h" , Bool
False , Text
"\8230" )
  , ( Text
"dots.v" , Bool
False , Text
"\8942" )
  , ( Text
"dots.down" , Bool
False , Text
"\8945" )
  , ( Text
"dots.up" , Bool
False , Text
"\8944" )
  , ( Text
"tilde.op" , Bool
True , Text
"\8764" )
  , ( Text
"tilde.basic" , Bool
True , Text
"~" )
  , ( Text
"tilde.dot" , Bool
False , Text
"\10858" )
  , ( Text
"tilde.eq" , Bool
False , Text
"\8771" )
  , ( Text
"tilde.eq.not" , Bool
False , Text
"\8772" )
  , ( Text
"tilde.eq.rev" , Bool
False , Text
"\8909" )
  , ( Text
"tilde.equiv" , Bool
False , Text
"\8773" )
  , ( Text
"tilde.equiv.not" , Bool
False , Text
"\8775" )
  , ( Text
"tilde.nequiv" , Bool
False , Text
"\8774" )
  , ( Text
"tilde.not" , Bool
False , Text
"\8769" )
  , ( Text
"tilde.rev" , Bool
False , Text
"\8765" )
  , ( Text
"tilde.rev.equiv" , Bool
False , Text
"\8780" )
  , ( Text
"tilde.triple" , Bool
False , Text
"\8779" )
  , ( Text
"acute" , Bool
True , Text
"\180" )
  , ( Text
"acute.double" , Bool
True , Text
"\733" )
  , ( Text
"breve" , Bool
True , Text
"\728" )
  , ( Text
"caret" , Bool
False , Text
"\8248" )
  , ( Text
"caron" , Bool
True , Text
"\711" )
  , ( Text
"hat" , Bool
True , Text
"^" )
  , ( Text
"diaer" , Bool
True , Text
"\168" )
  , ( Text
"grave" , Bool
True , Text
"`" )
  , ( Text
"macron" , Bool
True , Text
"\175" )
  , ( Text
"quote.double" , Bool
False , Text
"\"" )
  , ( Text
"quote.single" , Bool
False , Text
"'" )
  , ( Text
"quote.l.double" , Bool
False , Text
"\8220" )
  , ( Text
"quote.l.single" , Bool
False , Text
"\8216" )
  , ( Text
"quote.r.double" , Bool
False , Text
"\8221" )
  , ( Text
"quote.r.single" , Bool
False , Text
"\8217" )
  , ( Text
"quote.angle.l.double" , Bool
False , Text
"\171" )
  , ( Text
"quote.angle.l.single" , Bool
False , Text
"\8249" )
  , ( Text
"quote.angle.r.double" , Bool
False , Text
"\187" )
  , ( Text
"quote.angle.r.single" , Bool
False , Text
"\8250" )
  , ( Text
"quote.high.double" , Bool
False , Text
"\8223" )
  , ( Text
"quote.high.single" , Bool
False , Text
"\8219" )
  , ( Text
"quote.low.double" , Bool
False , Text
"\8222" )
  , ( Text
"quote.low.single" , Bool
False , Text
"\8218" )
  , ( Text
"prime" , Bool
False , Text
"\8242" )
  , ( Text
"prime.rev" , Bool
False , Text
"\8245" )
  , ( Text
"prime.double" , Bool
False , Text
"\8243" )
  , ( Text
"prime.double.rev" , Bool
False , Text
"\8246" )
  , ( Text
"prime.triple" , Bool
False , Text
"\8244" )
  , ( Text
"prime.triple.rev" , Bool
False , Text
"\8247" )
  , ( Text
"prime.quad" , Bool
False , Text
"\8279" )
  , ( Text
"plus" , Bool
False , Text
"+" )
  , ( Text
"plus.circle" , Bool
False , Text
"\8853" )
  , ( Text
"plus.circle.arrow" , Bool
False , Text
"\10228" )
  , ( Text
"plus.circle.big" , Bool
False , Text
"\10753" )
  , ( Text
"plus.dot" , Bool
False , Text
"\8724" )
  , ( Text
"plus.minus" , Bool
False , Text
"\177" )
  , ( Text
"plus.small" , Bool
False , Text
"\65122" )
  , ( Text
"plus.square" , Bool
False , Text
"\8862" )
  , ( Text
"plus.triangle" , Bool
False , Text
"\10809" )
  , ( Text
"minus" , Bool
True , Text
"\8722" )
  , ( Text
"minus.circle" , Bool
False , Text
"\8854" )
  , ( Text
"minus.dot" , Bool
False , Text
"\8760" )
  , ( Text
"minus.plus" , Bool
False , Text
"\8723" )
  , ( Text
"minus.square" , Bool
False , Text
"\8863" )
  , ( Text
"minus.tilde" , Bool
False , Text
"\8770" )
  , ( Text
"minus.triangle" , Bool
False , Text
"\10810" )
  , ( Text
"div" , Bool
False , Text
"\247" )
  , ( Text
"div.circle" , Bool
False , Text
"\10808" )
  , ( Text
"times" , Bool
False , Text
"\215" )
  , ( Text
"times.big" , Bool
False , Text
"\10761" )
  , ( Text
"times.circle" , Bool
False , Text
"\8855" )
  , ( Text
"times.circle.big" , Bool
False , Text
"\10754" )
  , ( Text
"times.div" , Bool
False , Text
"\8903" )
  , ( Text
"times.three.l" , Bool
False , Text
"\8907" )
  , ( Text
"times.three.r" , Bool
False , Text
"\8908" )
  , ( Text
"times.l" , Bool
False , Text
"\8905" )
  , ( Text
"times.r" , Bool
False , Text
"\8906" )
  , ( Text
"times.square" , Bool
False , Text
"\8864" )
  , ( Text
"times.triangle" , Bool
False , Text
"\10811" )
  , ( Text
"ratio" , Bool
False , Text
"\8758" )
  , ( Text
"eq" , Bool
False , Text
"=" )
  , ( Text
"eq.star" , Bool
False , Text
"\8795" )
  , ( Text
"eq.circle" , Bool
False , Text
"\8860" )
  , ( Text
"eq.colon" , Bool
False , Text
"\8789" )
  , ( Text
"eq.def" , Bool
False , Text
"\8797" )
  , ( Text
"eq.delta" , Bool
False , Text
"\8796" )
  , ( Text
"eq.equi" , Bool
False , Text
"\8794" )
  , ( Text
"eq.est" , Bool
False , Text
"\8793" )
  , ( Text
"eq.gt" , Bool
False , Text
"\8925" )
  , ( Text
"eq.lt" , Bool
False , Text
"\8924" )
  , ( Text
"eq.m" , Bool
False , Text
"\8798" )
  , ( Text
"eq.not" , Bool
False , Text
"\8800" )
  , ( Text
"eq.prec" , Bool
False , Text
"\8926" )
  , ( Text
"eq.quest" , Bool
False , Text
"\8799" )
  , ( Text
"eq.small" , Bool
False , Text
"\65126" )
  , ( Text
"eq.succ" , Bool
False , Text
"\8927" )
  , ( Text
"eq.triple" , Bool
False , Text
"\8801" )
  , ( Text
"eq.quad" , Bool
False , Text
"\8803" )
  , ( Text
"gt" , Bool
False , Text
">" )
  , ( Text
"gt.circle" , Bool
False , Text
"\10689" )
  , ( Text
"gt.curly" , Bool
False , Text
"\8827" )
  , ( Text
"gt.curly.approx" , Bool
False , Text
"\10936" )
  , ( Text
"gt.curly.double" , Bool
False , Text
"\10940" )
  , ( Text
"gt.curly.eq" , Bool
False , Text
"\8829" )
  , ( Text
"gt.curly.eq.not" , Bool
False , Text
"\8929" )
  , ( Text
"gt.curly.equiv" , Bool
False , Text
"\10932" )
  , ( Text
"gt.curly.napprox" , Bool
False , Text
"\10938" )
  , ( Text
"gt.curly.nequiv" , Bool
False , Text
"\10934" )
  , ( Text
"gt.curly.not" , Bool
False , Text
"\8833" )
  , ( Text
"gt.curly.ntilde" , Bool
False , Text
"\8937" )
  , ( Text
"gt.curly.tilde" , Bool
False , Text
"\8831" )
  , ( Text
"gt.dot" , Bool
False , Text
"\8919" )
  , ( Text
"gt.approx" , Bool
False , Text
"\10886" )
  , ( Text
"gt.double" , Bool
False , Text
"\8811" )
  , ( Text
"gt.eq" , Bool
False , Text
"\8805" )
  , ( Text
"gt.eq.slant" , Bool
False , Text
"\10878" )
  , ( Text
"gt.eq.lt" , Bool
False , Text
"\8923" )
  , ( Text
"gt.eq.not" , Bool
False , Text
"\8817" )
  , ( Text
"gt.equiv" , Bool
False , Text
"\8807" )
  , ( Text
"gt.lt" , Bool
False , Text
"\8823" )
  , ( Text
"gt.lt.not" , Bool
False , Text
"\8825" )
  , ( Text
"gt.napprox" , Bool
False , Text
"\10890" )
  , ( Text
"gt.nequiv" , Bool
False , Text
"\8809" )
  , ( Text
"gt.not" , Bool
False , Text
"\8815" )
  , ( Text
"gt.ntilde" , Bool
False , Text
"\8935" )
  , ( Text
"gt.small" , Bool
False , Text
"\65125" )
  , ( Text
"gt.tilde" , Bool
False , Text
"\8819" )
  , ( Text
"gt.tilde.not" , Bool
False , Text
"\8821" )
  , ( Text
"gt.tri" , Bool
False , Text
"\8883" )
  , ( Text
"gt.tri.eq" , Bool
False , Text
"\8885" )
  , ( Text
"gt.tri.eq.not" , Bool
False , Text
"\8941" )
  , ( Text
"gt.tri.not" , Bool
False , Text
"\8939" )
  , ( Text
"gt.triple" , Bool
False , Text
"\8921" )
  , ( Text
"gt.triple.nested" , Bool
False , Text
"\11000" )
  , ( Text
"lt" , Bool
False , Text
"<" )
  , ( Text
"lt.circle" , Bool
False , Text
"\10688" )
  , ( Text
"lt.curly" , Bool
False , Text
"\8826" )
  , ( Text
"lt.curly.approx" , Bool
False , Text
"\10935" )
  , ( Text
"lt.curly.double" , Bool
False , Text
"\10939" )
  , ( Text
"lt.curly.eq" , Bool
False , Text
"\8828" )
  , ( Text
"lt.curly.eq.not" , Bool
False , Text
"\8928" )
  , ( Text
"lt.curly.equiv" , Bool
False , Text
"\10931" )
  , ( Text
"lt.curly.napprox" , Bool
False , Text
"\10937" )
  , ( Text
"lt.curly.nequiv" , Bool
False , Text
"\10933" )
  , ( Text
"lt.curly.not" , Bool
False , Text
"\8832" )
  , ( Text
"lt.curly.ntilde" , Bool
False , Text
"\8936" )
  , ( Text
"lt.curly.tilde" , Bool
False , Text
"\8830" )
  , ( Text
"lt.dot" , Bool
False , Text
"\8918" )
  , ( Text
"lt.approx" , Bool
False , Text
"\10885" )
  , ( Text
"lt.double" , Bool
False , Text
"\8810" )
  , ( Text
"lt.eq" , Bool
False , Text
"\8804" )
  , ( Text
"lt.eq.slant" , Bool
False , Text
"\10877" )
  , ( Text
"lt.eq.gt" , Bool
False , Text
"\8922" )
  , ( Text
"lt.eq.not" , Bool
False , Text
"\8816" )
  , ( Text
"lt.equiv" , Bool
False , Text
"\8806" )
  , ( Text
"lt.gt" , Bool
False , Text
"\8822" )
  , ( Text
"lt.gt.not" , Bool
False , Text
"\8824" )
  , ( Text
"lt.napprox" , Bool
False , Text
"\10889" )
  , ( Text
"lt.nequiv" , Bool
False , Text
"\8808" )
  , ( Text
"lt.not" , Bool
False , Text
"\8814" )
  , ( Text
"lt.ntilde" , Bool
False , Text
"\8934" )
  , ( Text
"lt.small" , Bool
False , Text
"\65124" )
  , ( Text
"lt.tilde" , Bool
False , Text
"\8818" )
  , ( Text
"lt.tilde.not" , Bool
False , Text
"\8820" )
  , ( Text
"lt.tri" , Bool
False , Text
"\8882" )
  , ( Text
"lt.tri.eq" , Bool
False , Text
"\8884" )
  , ( Text
"lt.tri.eq.not" , Bool
False , Text
"\8940" )
  , ( Text
"lt.tri.not" , Bool
False , Text
"\8938" )
  , ( Text
"lt.triple" , Bool
False , Text
"\8920" )
  , ( Text
"lt.triple.nested" , Bool
False , Text
"\10999" )
  , ( Text
"approx" , Bool
False , Text
"\8776" )
  , ( Text
"approx.eq" , Bool
False , Text
"\8778" )
  , ( Text
"approx.not" , Bool
False , Text
"\8777" )
  , ( Text
"prec" , Bool
False , Text
"\8826" )
  , ( Text
"prec.approx" , Bool
False , Text
"\10935" )
  , ( Text
"prec.double" , Bool
False , Text
"\10939" )
  , ( Text
"prec.eq" , Bool
False , Text
"\8828" )
  , ( Text
"prec.eq.not" , Bool
False , Text
"\8928" )
  , ( Text
"prec.equiv" , Bool
False , Text
"\10931" )
  , ( Text
"prec.napprox" , Bool
False , Text
"\10937" )
  , ( Text
"prec.nequiv" , Bool
False , Text
"\10933" )
  , ( Text
"prec.not" , Bool
False , Text
"\8832" )
  , ( Text
"prec.ntilde" , Bool
False , Text
"\8936" )
  , ( Text
"prec.tilde" , Bool
False , Text
"\8830" )
  , ( Text
"succ" , Bool
False , Text
"\8827" )
  , ( Text
"succ.approx" , Bool
False , Text
"\10936" )
  , ( Text
"succ.double" , Bool
False , Text
"\10940" )
  , ( Text
"succ.eq" , Bool
False , Text
"\8829" )
  , ( Text
"succ.eq.not" , Bool
False , Text
"\8929" )
  , ( Text
"succ.equiv" , Bool
False , Text
"\10932" )
  , ( Text
"succ.napprox" , Bool
False , Text
"\10938" )
  , ( Text
"succ.nequiv" , Bool
False , Text
"\10934" )
  , ( Text
"succ.not" , Bool
False , Text
"\8833" )
  , ( Text
"succ.ntilde" , Bool
False , Text
"\8937" )
  , ( Text
"succ.tilde" , Bool
False , Text
"\8831" )
  , ( Text
"equiv" , Bool
False , Text
"\8801" )
  , ( Text
"equiv.not" , Bool
False , Text
"\8802" )
  , ( Text
"prop" , Bool
False , Text
"\8733" )
  , ( Text
"emptyset" , Bool
False , Text
"\8709" )
  , ( Text
"emptyset.rev" , Bool
False , Text
"\10672" )
  , ( Text
"nothing" , Bool
False , Text
"\8709" )
  , ( Text
"nothing.rev" , Bool
False , Text
"\10672" )
  , ( Text
"without" , Bool
False , Text
"\8726" )
  , ( Text
"complement" , Bool
False , Text
"\8705" )
  , ( Text
"in" , Bool
False , Text
"\8712" )
  , ( Text
"in.not" , Bool
False , Text
"\8713" )
  , ( Text
"in.rev" , Bool
False , Text
"\8715" )
  , ( Text
"in.rev.not" , Bool
False , Text
"\8716" )
  , ( Text
"in.rev.small" , Bool
False , Text
"\8717" )
  , ( Text
"in.small" , Bool
False , Text
"\8714" )
  , ( Text
"subset" , Bool
False , Text
"\8834" )
  , ( Text
"subset.dot" , Bool
False , Text
"\10941" )
  , ( Text
"subset.double" , Bool
False , Text
"\8912" )
  , ( Text
"subset.eq" , Bool
False , Text
"\8838" )
  , ( Text
"subset.eq.not" , Bool
False , Text
"\8840" )
  , ( Text
"subset.eq.sq" , Bool
False , Text
"\8849" )
  , ( Text
"subset.eq.sq.not" , Bool
False , Text
"\8930" )
  , ( Text
"subset.neq" , Bool
False , Text
"\8842" )
  , ( Text
"subset.not" , Bool
False , Text
"\8836" )
  , ( Text
"subset.sq" , Bool
False , Text
"\8847" )
  , ( Text
"subset.sq.neq" , Bool
False , Text
"\8932" )
  , ( Text
"supset" , Bool
False , Text
"\8835" )
  , ( Text
"supset.dot" , Bool
False , Text
"\10942" )
  , ( Text
"supset.double" , Bool
False , Text
"\8913" )
  , ( Text
"supset.eq" , Bool
False , Text
"\8839" )
  , ( Text
"supset.eq.not" , Bool
False , Text
"\8841" )
  , ( Text
"supset.eq.sq" , Bool
False , Text
"\8850" )
  , ( Text
"supset.eq.sq.not" , Bool
False , Text
"\8931" )
  , ( Text
"supset.neq" , Bool
False , Text
"\8843" )
  , ( Text
"supset.not" , Bool
False , Text
"\8837" )
  , ( Text
"supset.sq" , Bool
False , Text
"\8848" )
  , ( Text
"supset.sq.neq" , Bool
False , Text
"\8933" )
  , ( Text
"union" , Bool
False , Text
"\8746" )
  , ( Text
"union.arrow" , Bool
False , Text
"\8844" )
  , ( Text
"union.big" , Bool
False , Text
"\8899" )
  , ( Text
"union.dot" , Bool
False , Text
"\8845" )
  , ( Text
"union.dot.big" , Bool
False , Text
"\10755" )
  , ( Text
"union.double" , Bool
False , Text
"\8915" )
  , ( Text
"union.minus" , Bool
False , Text
"\10817" )
  , ( Text
"union.or" , Bool
False , Text
"\10821" )
  , ( Text
"union.plus" , Bool
False , Text
"\8846" )
  , ( Text
"union.plus.big" , Bool
False , Text
"\10756" )
  , ( Text
"union.sq" , Bool
False , Text
"\8852" )
  , ( Text
"union.sq.big" , Bool
False , Text
"\10758" )
  , ( Text
"union.sq.double" , Bool
False , Text
"\10831" )
  , ( Text
"sect" , Bool
False , Text
"\8745" )
  , ( Text
"sect.and" , Bool
False , Text
"\10820" )
  , ( Text
"sect.big" , Bool
False , Text
"\8898" )
  , ( Text
"sect.dot" , Bool
False , Text
"\10816" )
  , ( Text
"sect.double" , Bool
False , Text
"\8914" )
  , ( Text
"sect.sq" , Bool
False , Text
"\8851" )
  , ( Text
"sect.sq.big" , Bool
False , Text
"\10757" )
  , ( Text
"sect.sq.double" , Bool
False , Text
"\10830" )
  , ( Text
"infinity" , Bool
False , Text
"\8734" )
  , ( Text
"oo" , Bool
False , Text
"\8734" )
  , ( Text
"diff" , Bool
False , Text
"\8706" )
  , ( Text
"partial" , Bool
False , Text
"\8706" )
  , ( Text
"gradient" , Bool
False , Text
"\8711" )
  , ( Text
"nabla" , Bool
False , Text
"\8711" )
  , ( Text
"sum" , Bool
False , Text
"\8721" )
  , ( Text
"sum.integral" , Bool
False , Text
"\10763" )
  , ( Text
"product" , Bool
False , Text
"\8719" )
  , ( Text
"product.co" , Bool
False , Text
"\8720" )
  , ( Text
"integral" , Bool
False , Text
"\8747" )
  , ( Text
"integral.arrow.hook" , Bool
False , Text
"\10775" )
  , ( Text
"integral.ccw" , Bool
False , Text
"\10769" )
  , ( Text
"integral.cont" , Bool
False , Text
"\8750" )
  , ( Text
"integral.cont.ccw" , Bool
False , Text
"\8755" )
  , ( Text
"integral.cont.cw" , Bool
False , Text
"\8754" )
  , ( Text
"integral.cw" , Bool
False , Text
"\8753" )
  , ( Text
"integral.dash" , Bool
False , Text
"\10765" )
  , ( Text
"integral.dash.double" , Bool
False , Text
"\10766" )
  , ( Text
"integral.double" , Bool
False , Text
"\8748" )
  , ( Text
"integral.quad" , Bool
False , Text
"\10764" )
  , ( Text
"integral.sect" , Bool
False , Text
"\10777" )
  , ( Text
"integral.slash" , Bool
False , Text
"\10767" )
  , ( Text
"integral.square" , Bool
False , Text
"\10774" )
  , ( Text
"integral.surf" , Bool
False , Text
"\8751" )
  , ( Text
"integral.times" , Bool
False , Text
"\10776" )
  , ( Text
"integral.triple" , Bool
False , Text
"\8749" )
  , ( Text
"integral.union" , Bool
False , Text
"\10778" )
  , ( Text
"integral.vol" , Bool
False , Text
"\8752" )
  , ( Text
"laplace" , Bool
False , Text
"\8710" )
  , ( Text
"forall" , Bool
False , Text
"\8704" )
  , ( Text
"exists" , Bool
False , Text
"\8707" )
  , ( Text
"exists.not" , Bool
False , Text
"\8708" )
  , ( Text
"top" , Bool
False , Text
"\8868" )
  , ( Text
"bot" , Bool
False , Text
"\8869" )
  , ( Text
"not" , Bool
False , Text
"\172" )
  , ( Text
"and" , Bool
False , Text
"\8743" )
  , ( Text
"and.big" , Bool
False , Text
"\8896" )
  , ( Text
"and.curly" , Bool
False , Text
"\8911" )
  , ( Text
"and.dot" , Bool
False , Text
"\10193" )
  , ( Text
"and.double" , Bool
False , Text
"\10835" )
  , ( Text
"or" , Bool
False , Text
"\8744" )
  , ( Text
"or.big" , Bool
False , Text
"\8897" )
  , ( Text
"or.curly" , Bool
False , Text
"\8910" )
  , ( Text
"or.dot" , Bool
False , Text
"\10183" )
  , ( Text
"or.double" , Bool
False , Text
"\10836" )
  , ( Text
"xor" , Bool
False , Text
"\8853" )
  , ( Text
"xor.big" , Bool
False , Text
"\10753" )
  , ( Text
"models" , Bool
False , Text
"\8871" )
  , ( Text
"forces" , Bool
False , Text
"\8873" )
  , ( Text
"forces.not" , Bool
False , Text
"\8878" )
  , ( Text
"therefore" , Bool
False , Text
"\8756" )
  , ( Text
"because" , Bool
False , Text
"\8757" )
  , ( Text
"qed" , Bool
False , Text
"\8718" )
  , ( Text
"compose" , Bool
True , Text
"\8728" )
  , ( Text
"convolve" , Bool
False , Text
"\8727" )
  , ( Text
"multimap" , Bool
False , Text
"\8888" )
  , ( Text
"divides" , Bool
False , Text
"\8739" )
  , ( Text
"divides.not" , Bool
False , Text
"\8740" )
  , ( Text
"wreath" , Bool
False , Text
"\8768" )
  , ( Text
"parallel" , Bool
False , Text
"\8741" )
  , ( Text
"parallel.circle" , Bool
False , Text
"\10679" )
  , ( Text
"parallel.not" , Bool
False , Text
"\8742" )
  , ( Text
"perp" , Bool
False , Text
"\10178" )
  , ( Text
"perp.circle" , Bool
False , Text
"\10681" )
  , ( Text
"diameter" , Bool
False , Text
"\8960" )
  , ( Text
"join" , Bool
False , Text
"\10781" )
  , ( Text
"join.r" , Bool
False , Text
"\10198" )
  , ( Text
"join.l" , Bool
False , Text
"\10197" )
  , ( Text
"join.l.r" , Bool
False , Text
"\10199" )
  , ( Text
"degree" , Bool
False , Text
"\176" )
  , ( Text
"degree.c" , Bool
False , Text
"\8451" )
  , ( Text
"degree.f" , Bool
False , Text
"\8457" )
  , ( Text
"smash" , Bool
False , Text
"\10803" )
  , ( Text
"bitcoin" , Bool
False , Text
"\8383" )
  , ( Text
"dollar" , Bool
False , Text
"$" )
  , ( Text
"euro" , Bool
False , Text
"\8364" )
  , ( Text
"franc" , Bool
False , Text
"\8355" )
  , ( Text
"lira" , Bool
False , Text
"\8378" )
  , ( Text
"peso" , Bool
False , Text
"\8369" )
  , ( Text
"pound" , Bool
False , Text
"\163" )
  , ( Text
"ruble" , Bool
False , Text
"\8381" )
  , ( Text
"rupee" , Bool
False , Text
"\8377" )
  , ( Text
"won" , Bool
False , Text
"\8361" )
  , ( Text
"yen" , Bool
False , Text
"\165" )
  , ( Text
"ballot" , Bool
False , Text
"\9744" )
  , ( Text
"ballot.x" , Bool
False , Text
"\9746" )
  , ( Text
"checkmark" , Bool
False , Text
"\10003" )
  , ( Text
"checkmark.light" , Bool
False , Text
"\128504" )
  , ( Text
"floral" , Bool
False , Text
"\10086" )
  , ( Text
"floral.l" , Bool
False , Text
"\9753" )
  , ( Text
"floral.r" , Bool
False , Text
"\10087" )
  , ( Text
"notes.up" , Bool
False , Text
"\127900" )
  , ( Text
"notes.down" , Bool
False , Text
"\127901" )
  , ( Text
"refmark" , Bool
False , Text
"\8251" )
  , ( Text
"servicemark" , Bool
False , Text
"\8480" )
  , ( Text
"maltese" , Bool
False , Text
"\10016" )
  , ( Text
"suit.club" , Bool
False , Text
"\9827" )
  , ( Text
"suit.diamond" , Bool
False , Text
"\9830" )
  , ( Text
"suit.heart" , Bool
False , Text
"\9829" )
  , ( Text
"suit.spade" , Bool
False , Text
"\9824" )
  , ( Text
"bullet" , Bool
False , Text
"\8226" )
  , ( Text
"circle.stroked" , Bool
True , Text
"\9675" )
  , ( Text
"circle.stroked.tiny" , Bool
True , Text
"\8728" )
  , ( Text
"circle.stroked.small" , Bool
False , Text
"\9900" )
  , ( Text
"circle.stroked.big" , Bool
False , Text
"\9711" )
  , ( Text
"circle.filled" , Bool
False , Text
"\9679" )
  , ( Text
"circle.filled.tiny" , Bool
False , Text
"\10625" )
  , ( Text
"circle.filled.small" , Bool
False , Text
"\8729" )
  , ( Text
"circle.filled.big" , Bool
False , Text
"\11044" )
  , ( Text
"circle.dotted" , Bool
False , Text
"\9676" )
  , ( Text
"circle.nested" , Bool
False , Text
"\8858" )
  , ( Text
"ellipse.stroked.h" , Bool
False , Text
"\11053" )
  , ( Text
"ellipse.stroked.v" , Bool
False , Text
"\11055" )
  , ( Text
"ellipse.filled.h" , Bool
False , Text
"\11052" )
  , ( Text
"ellipse.filled.v" , Bool
False , Text
"\11054" )
  , ( Text
"triangle.stroked.r" , Bool
False , Text
"\9655" )
  , ( Text
"triangle.stroked.l" , Bool
False , Text
"\9665" )
  , ( Text
"triangle.stroked.t" , Bool
False , Text
"\9651" )
  , ( Text
"triangle.stroked.b" , Bool
False , Text
"\9661" )
  , ( Text
"triangle.stroked.bl" , Bool
False , Text
"\9722" )
  , ( Text
"triangle.stroked.br" , Bool
False , Text
"\9727" )
  , ( Text
"triangle.stroked.tl" , Bool
False , Text
"\9720" )
  , ( Text
"triangle.stroked.tr" , Bool
False , Text
"\9721" )
  , ( Text
"triangle.stroked.small.r" , Bool
False , Text
"\9657" )
  , ( Text
"triangle.stroked.small.b" , Bool
False , Text
"\9663" )
  , ( Text
"triangle.stroked.small.l" , Bool
False , Text
"\9667" )
  , ( Text
"triangle.stroked.small.t" , Bool
False , Text
"\9653" )
  , ( Text
"triangle.stroked.rounded" , Bool
False , Text
"\128710" )
  , ( Text
"triangle.stroked.nested" , Bool
False , Text
"\10177" )
  , ( Text
"triangle.stroked.dot" , Bool
False , Text
"\9708" )
  , ( Text
"triangle.filled.r" , Bool
False , Text
"\9654" )
  , ( Text
"triangle.filled.l" , Bool
False , Text
"\9664" )
  , ( Text
"triangle.filled.t" , Bool
False , Text
"\9650" )
  , ( Text
"triangle.filled.b" , Bool
False , Text
"\9660" )
  , ( Text
"triangle.filled.bl" , Bool
False , Text
"\9699" )
  , ( Text
"triangle.filled.br" , Bool
False , Text
"\9698" )
  , ( Text
"triangle.filled.tl" , Bool
False , Text
"\9700" )
  , ( Text
"triangle.filled.tr" , Bool
False , Text
"\9701" )
  , ( Text
"triangle.filled.small.r" , Bool
False , Text
"\9656" )
  , ( Text
"triangle.filled.small.b" , Bool
False , Text
"\9662" )
  , ( Text
"triangle.filled.small.l" , Bool
False , Text
"\9666" )
  , ( Text
"triangle.filled.small.t" , Bool
False , Text
"\9652" )
  , ( Text
"square.stroked" , Bool
False , Text
"\9633" )
  , ( Text
"square.stroked.tiny" , Bool
False , Text
"\9643" )
  , ( Text
"square.stroked.small" , Bool
False , Text
"\9725" )
  , ( Text
"square.stroked.medium" , Bool
False , Text
"\9723" )
  , ( Text
"square.stroked.big" , Bool
False , Text
"\11036" )
  , ( Text
"square.stroked.dotted" , Bool
False , Text
"\11034" )
  , ( Text
"square.stroked.rounded" , Bool
False , Text
"\9634" )
  , ( Text
"square.filled" , Bool
False , Text
"\9632" )
  , ( Text
"square.filled.tiny" , Bool
False , Text
"\9642" )
  , ( Text
"square.filled.small" , Bool
False , Text
"\9726" )
  , ( Text
"square.filled.medium" , Bool
False , Text
"\9724" )
  , ( Text
"square.filled.big" , Bool
False , Text
"\11035" )
  , ( Text
"rect.stroked.h" , Bool
False , Text
"\9645" )
  , ( Text
"rect.stroked.v" , Bool
False , Text
"\9647" )
  , ( Text
"rect.filled.h" , Bool
False , Text
"\9644" )
  , ( Text
"rect.filled.v" , Bool
False , Text
"\9646" )
  , ( Text
"penta.stroked" , Bool
False , Text
"\11040" )
  , ( Text
"penta.filled" , Bool
False , Text
"\11039" )
  , ( Text
"hexa.stroked" , Bool
False , Text
"\11041" )
  , ( Text
"hexa.filled" , Bool
False , Text
"\11042" )
  , ( Text
"diamond.stroked" , Bool
False , Text
"\9671" )
  , ( Text
"diamond.stroked.small" , Bool
False , Text
"\8900" )
  , ( Text
"diamond.stroked.medium" , Bool
False , Text
"\11046" )
  , ( Text
"diamond.stroked.dot" , Bool
False , Text
"\10192" )
  , ( Text
"diamond.filled" , Bool
False , Text
"\9670" )
  , ( Text
"diamond.filled.medium" , Bool
False , Text
"\11045" )
  , ( Text
"diamond.filled.small" , Bool
False , Text
"\11049" )
  , ( Text
"lozenge.stroked" , Bool
False , Text
"\9674" )
  , ( Text
"lozenge.stroked.small" , Bool
False , Text
"\11051" )
  , ( Text
"lozenge.stroked.medium" , Bool
False , Text
"\11048" )
  , ( Text
"lozenge.filled" , Bool
False , Text
"\10731" )
  , ( Text
"lozenge.filled.small" , Bool
False , Text
"\11050" )
  , ( Text
"lozenge.filled.medium" , Bool
False , Text
"\11047" )
  , ( Text
"star.op" , Bool
False , Text
"\8902" )
  , ( Text
"star.stroked" , Bool
False , Text
"\9734" )
  , ( Text
"star.filled" , Bool
False , Text
"\9733" )
  , ( Text
"arrow.r" , Bool
True , Text
"\8594" )
  , ( Text
"arrow.r.long.bar" , Bool
False , Text
"\10236" )
  , ( Text
"arrow.r.bar" , Bool
False , Text
"\8614" )
  , ( Text
"arrow.r.curve" , Bool
False , Text
"\10551" )
  , ( Text
"arrow.r.dashed" , Bool
False , Text
"\8674" )
  , ( Text
"arrow.r.dotted" , Bool
False , Text
"\10513" )
  , ( Text
"arrow.r.double" , Bool
False , Text
"\8658" )
  , ( Text
"arrow.r.double.bar" , Bool
False , Text
"\10503" )
  , ( Text
"arrow.r.double.long" , Bool
False , Text
"\10233" )
  , ( Text
"arrow.r.double.long.bar" , Bool
False , Text
"\10238" )
  , ( Text
"arrow.r.double.not" , Bool
False , Text
"\8655" )
  , ( Text
"arrow.r.filled" , Bool
False , Text
"\10145" )
  , ( Text
"arrow.r.hook" , Bool
False , Text
"\8618" )
  , ( Text
"arrow.r.long" , Bool
True , Text
"\10230" )
  , ( Text
"arrow.r.long.squiggly" , Bool
False , Text
"\10239" )
  , ( Text
"arrow.r.loop" , Bool
False , Text
"\8620" )
  , ( Text
"arrow.r.not" , Bool
False , Text
"\8603" )
  , ( Text
"arrow.r.quad" , Bool
False , Text
"\11078" )
  , ( Text
"arrow.r.squiggly" , Bool
False , Text
"\8669" )
  , ( Text
"arrow.r.stop" , Bool
False , Text
"\8677" )
  , ( Text
"arrow.r.stroked" , Bool
False , Text
"\8680" )
  , ( Text
"arrow.r.tail" , Bool
False , Text
"\8611" )
  , ( Text
"arrow.r.tilde" , Bool
False , Text
"\10610" )
  , ( Text
"arrow.r.triple" , Bool
False , Text
"\8667" )
  , ( Text
"arrow.r.twohead.bar" , Bool
False , Text
"\10501" )
  , ( Text
"arrow.r.twohead" , Bool
False , Text
"\8608" )
  , ( Text
"arrow.r.wave" , Bool
False , Text
"\8605" )
  , ( Text
"arrow.l" , Bool
True , Text
"\8592" )
  , ( Text
"arrow.l.bar" , Bool
False , Text
"\8612" )
  , ( Text
"arrow.l.curve" , Bool
False , Text
"\10550" )
  , ( Text
"arrow.l.dashed" , Bool
False , Text
"\8672" )
  , ( Text
"arrow.l.dotted" , Bool
False , Text
"\11064" )
  , ( Text
"arrow.l.double" , Bool
False , Text
"\8656" )
  , ( Text
"arrow.l.double.bar" , Bool
False , Text
"\10502" )
  , ( Text
"arrow.l.double.long" , Bool
False , Text
"\10232" )
  , ( Text
"arrow.l.double.long.bar" , Bool
False , Text
"\10237" )
  , ( Text
"arrow.l.double.not" , Bool
False , Text
"\8653" )
  , ( Text
"arrow.l.filled" , Bool
False , Text
"\11013" )
  , ( Text
"arrow.l.hook" , Bool
False , Text
"\8617" )
  , ( Text
"arrow.l.long" , Bool
False , Text
"\10229" )
  , ( Text
"arrow.l.long.bar" , Bool
False , Text
"\10235" )
  , ( Text
"arrow.l.long.squiggly" , Bool
False , Text
"\11059" )
  , ( Text
"arrow.l.loop" , Bool
False , Text
"\8619" )
  , ( Text
"arrow.l.not" , Bool
False , Text
"\8602" )
  , ( Text
"arrow.l.quad" , Bool
False , Text
"\11077" )
  , ( Text
"arrow.l.squiggly" , Bool
False , Text
"\8668" )
  , ( Text
"arrow.l.stop" , Bool
False , Text
"\8676" )
  , ( Text
"arrow.l.stroked" , Bool
False , Text
"\8678" )
  , ( Text
"arrow.l.tail" , Bool
False , Text
"\8610" )
  , ( Text
"arrow.l.tilde" , Bool
False , Text
"\11081" )
  , ( Text
"arrow.l.triple" , Bool
False , Text
"\8666" )
  , ( Text
"arrow.l.twohead.bar" , Bool
False , Text
"\11062" )
  , ( Text
"arrow.l.twohead" , Bool
False , Text
"\8606" )
  , ( Text
"arrow.l.wave" , Bool
False , Text
"\8604" )
  , ( Text
"arrow.t" , Bool
False , Text
"\8593" )
  , ( Text
"arrow.t.bar" , Bool
False , Text
"\8613" )
  , ( Text
"arrow.t.curve" , Bool
False , Text
"\10548" )
  , ( Text
"arrow.t.dashed" , Bool
False , Text
"\8673" )
  , ( Text
"arrow.t.double" , Bool
False , Text
"\8657" )
  , ( Text
"arrow.t.filled" , Bool
False , Text
"\11014" )
  , ( Text
"arrow.t.quad" , Bool
False , Text
"\10224" )
  , ( Text
"arrow.t.stop" , Bool
False , Text
"\10514" )
  , ( Text
"arrow.t.stroked" , Bool
False , Text
"\8679" )
  , ( Text
"arrow.t.triple" , Bool
False , Text
"\10506" )
  , ( Text
"arrow.t.twohead" , Bool
False , Text
"\8607" )
  , ( Text
"arrow.b" , Bool
False , Text
"\8595" )
  , ( Text
"arrow.b.bar" , Bool
False , Text
"\8615" )
  , ( Text
"arrow.b.curve" , Bool
False , Text
"\10549" )
  , ( Text
"arrow.b.dashed" , Bool
False , Text
"\8675" )
  , ( Text
"arrow.b.double" , Bool
False , Text
"\8659" )
  , ( Text
"arrow.b.filled" , Bool
False , Text
"\11015" )
  , ( Text
"arrow.b.quad" , Bool
False , Text
"\10225" )
  , ( Text
"arrow.b.stop" , Bool
False , Text
"\10515" )
  , ( Text
"arrow.b.stroked" , Bool
False , Text
"\8681" )
  , ( Text
"arrow.b.triple" , Bool
False , Text
"\10507" )
  , ( Text
"arrow.b.twohead" , Bool
False , Text
"\8609" )
  , ( Text
"arrow.l.r" , Bool
True , Text
"\8596" )
  , ( Text
"arrow.l.r.double" , Bool
False , Text
"\8660" )
  , ( Text
"arrow.l.r.double.long" , Bool
False , Text
"\10234" )
  , ( Text
"arrow.l.r.double.not" , Bool
False , Text
"\8654" )
  , ( Text
"arrow.l.r.filled" , Bool
False , Text
"\11020" )
  , ( Text
"arrow.l.r.long" , Bool
True , Text
"\10231" )
  , ( Text
"arrow.l.r.not" , Bool
False , Text
"\8622" )
  , ( Text
"arrow.l.r.stroked" , Bool
False , Text
"\11012" )
  , ( Text
"arrow.l.r.wave" , Bool
False , Text
"\8621" )
  , ( Text
"arrow.t.b" , Bool
False , Text
"\8597" )
  , ( Text
"arrow.t.b.double" , Bool
False , Text
"\8661" )
  , ( Text
"arrow.t.b.filled" , Bool
False , Text
"\11021" )
  , ( Text
"arrow.t.b.stroked" , Bool
False , Text
"\8691" )
  , ( Text
"arrow.tr" , Bool
False , Text
"\8599" )
  , ( Text
"arrow.tr.double" , Bool
False , Text
"\8663" )
  , ( Text
"arrow.tr.filled" , Bool
False , Text
"\11016" )
  , ( Text
"arrow.tr.hook" , Bool
False , Text
"\10532" )
  , ( Text
"arrow.tr.stroked" , Bool
False , Text
"\11008" )
  , ( Text
"arrow.br" , Bool
False , Text
"\8600" )
  , ( Text
"arrow.br.double" , Bool
False , Text
"\8664" )
  , ( Text
"arrow.br.filled" , Bool
False , Text
"\11018" )
  , ( Text
"arrow.br.hook" , Bool
False , Text
"\10533" )
  , ( Text
"arrow.br.stroked" , Bool
False , Text
"\11010" )
  , ( Text
"arrow.tl" , Bool
False , Text
"\8598" )
  , ( Text
"arrow.tl.double" , Bool
False , Text
"\8662" )
  , ( Text
"arrow.tl.filled" , Bool
False , Text
"\11017" )
  , ( Text
"arrow.tl.hook" , Bool
False , Text
"\10531" )
  , ( Text
"arrow.tl.stroked" , Bool
False , Text
"\11009" )
  , ( Text
"arrow.bl" , Bool
False , Text
"\8601" )
  , ( Text
"arrow.bl.double" , Bool
False , Text
"\8665" )
  , ( Text
"arrow.bl.filled" , Bool
False , Text
"\11019" )
  , ( Text
"arrow.bl.hook" , Bool
False , Text
"\10534" )
  , ( Text
"arrow.bl.stroked" , Bool
False , Text
"\11011" )
  , ( Text
"arrow.tl.br" , Bool
False , Text
"\10529" )
  , ( Text
"arrow.tr.bl" , Bool
False , Text
"\10530" )
  , ( Text
"arrow.ccw" , Bool
False , Text
"\8634" )
  , ( Text
"arrow.ccw.half" , Bool
False , Text
"\8630" )
  , ( Text
"arrow.cw" , Bool
False , Text
"\8635" )
  , ( Text
"arrow.cw.half" , Bool
False , Text
"\8631" )
  , ( Text
"arrow.zigzag" , Bool
False , Text
"\8623" )
  , ( Text
"arrows.rr" , Bool
False , Text
"\8649" )
  , ( Text
"arrows.ll" , Bool
False , Text
"\8647" )
  , ( Text
"arrows.tt" , Bool
False , Text
"\8648" )
  , ( Text
"arrows.bb" , Bool
False , Text
"\8650" )
  , ( Text
"arrows.lr" , Bool
False , Text
"\8646" )
  , ( Text
"arrows.lr.stop" , Bool
False , Text
"\8633" )
  , ( Text
"arrows.rl" , Bool
False , Text
"\8644" )
  , ( Text
"arrows.tb" , Bool
False , Text
"\8645" )
  , ( Text
"arrows.bt" , Bool
False , Text
"\8693" )
  , ( Text
"arrows.rrr" , Bool
False , Text
"\8694" )
  , ( Text
"arrows.lll" , Bool
False , Text
"\11057" )
  , ( Text
"arrowhead.t" , Bool
False , Text
"\8963" )
  , ( Text
"arrowhead.b" , Bool
False , Text
"\8964" )
  , ( Text
"harpoon.rt" , Bool
True , Text
"\8640" )
  , ( Text
"harpoon.rt.bar" , Bool
False , Text
"\10587" )
  , ( Text
"harpoon.rt.stop" , Bool
False , Text
"\10579" )
  , ( Text
"harpoon.rb" , Bool
False , Text
"\8641" )
  , ( Text
"harpoon.rb.bar" , Bool
False , Text
"\10591" )
  , ( Text
"harpoon.rb.stop" , Bool
False , Text
"\10583" )
  , ( Text
"harpoon.lt" , Bool
True , Text
"\8636" )
  , ( Text
"harpoon.lt.bar" , Bool
False , Text
"\10586" )
  , ( Text
"harpoon.lt.stop" , Bool
False , Text
"\10578" )
  , ( Text
"harpoon.lb" , Bool
False , Text
"\8637" )
  , ( Text
"harpoon.lb.bar" , Bool
False , Text
"\10590" )
  , ( Text
"harpoon.lb.stop" , Bool
False , Text
"\10582" )
  , ( Text
"harpoon.tl" , Bool
False , Text
"\8639" )
  , ( Text
"harpoon.tl.bar" , Bool
False , Text
"\10592" )
  , ( Text
"harpoon.tl.stop" , Bool
False , Text
"\10584" )
  , ( Text
"harpoon.tr" , Bool
False , Text
"\8638" )
  , ( Text
"harpoon.tr.bar" , Bool
False , Text
"\10588" )
  , ( Text
"harpoon.tr.stop" , Bool
False , Text
"\10580" )
  , ( Text
"harpoon.bl" , Bool
False , Text
"\8643" )
  , ( Text
"harpoon.bl.bar" , Bool
False , Text
"\10593" )
  , ( Text
"harpoon.bl.stop" , Bool
False , Text
"\10585" )
  , ( Text
"harpoon.br" , Bool
False , Text
"\8642" )
  , ( Text
"harpoon.br.bar" , Bool
False , Text
"\10589" )
  , ( Text
"harpoon.br.stop" , Bool
False , Text
"\10581" )
  , ( Text
"harpoon.lt.rt" , Bool
False , Text
"\10574" )
  , ( Text
"harpoon.lb.rb" , Bool
False , Text
"\10576" )
  , ( Text
"harpoon.lb.rt" , Bool
False , Text
"\10571" )
  , ( Text
"harpoon.lt.rb" , Bool
False , Text
"\10570" )
  , ( Text
"harpoon.tl.bl" , Bool
False , Text
"\10577" )
  , ( Text
"harpoon.tr.br" , Bool
False , Text
"\10575" )
  , ( Text
"harpoon.tl.br" , Bool
False , Text
"\10573" )
  , ( Text
"harpoon.tr.bl" , Bool
False , Text
"\10572" )
  , ( Text
"harpoons.rtrb" , Bool
False , Text
"\10596" )
  , ( Text
"harpoons.blbr" , Bool
False , Text
"\10597" )
  , ( Text
"harpoons.bltr" , Bool
False , Text
"\10607" )
  , ( Text
"harpoons.lbrb" , Bool
False , Text
"\10599" )
  , ( Text
"harpoons.ltlb" , Bool
False , Text
"\10594" )
  , ( Text
"harpoons.ltrb" , Bool
False , Text
"\8651" )
  , ( Text
"harpoons.ltrt" , Bool
False , Text
"\10598" )
  , ( Text
"harpoons.rblb" , Bool
False , Text
"\10601" )
  , ( Text
"harpoons.rtlb" , Bool
False , Text
"\8652" )
  , ( Text
"harpoons.rtlt" , Bool
False , Text
"\10600" )
  , ( Text
"harpoons.tlbr" , Bool
False , Text
"\10606" )
  , ( Text
"harpoons.tltr" , Bool
False , Text
"\10595" )
  , ( Text
"tack.r" , Bool
False , Text
"\8866" )
  , ( Text
"tack.r.not" , Bool
False , Text
"\8876" )
  , ( Text
"tack.r.long" , Bool
False , Text
"\10205" )
  , ( Text
"tack.r.short" , Bool
False , Text
"\8870" )
  , ( Text
"tack.r.double" , Bool
False , Text
"\8872" )
  , ( Text
"tack.r.double.not" , Bool
False , Text
"\8877" )
  , ( Text
"tack.l" , Bool
False , Text
"\8867" )
  , ( Text
"tack.l.long" , Bool
False , Text
"\10206" )
  , ( Text
"tack.l.short" , Bool
False , Text
"\10974" )
  , ( Text
"tack.l.double" , Bool
False , Text
"\10980" )
  , ( Text
"tack.t" , Bool
False , Text
"\8869" )
  , ( Text
"tack.t.big" , Bool
False , Text
"\10200" )
  , ( Text
"tack.t.double" , Bool
False , Text
"\10987" )
  , ( Text
"tack.t.short" , Bool
False , Text
"\10976" )
  , ( Text
"tack.b" , Bool
False , Text
"\8868" )
  , ( Text
"tack.b.big" , Bool
False , Text
"\10201" )
  , ( Text
"tack.b.double" , Bool
False , Text
"\10986" )
  , ( Text
"tack.b.short" , Bool
False , Text
"\10975" )
  , ( Text
"tack.l.r" , Bool
False , Text
"\10203" )
  , ( Text
"alpha" , Bool
False , Text
"\945" )
  , ( Text
"beta" , Bool
False , Text
"\946" )
  , ( Text
"beta.alt" , Bool
False , Text
"\976" )
  , ( Text
"chi" , Bool
False , Text
"\967" )
  , ( Text
"delta" , Bool
False , Text
"\948" )
  , ( Text
"epsilon" , Bool
False , Text
"\949" )
  , ( Text
"epsilon.alt" , Bool
False , Text
"\1013" )
  , ( Text
"eta" , Bool
False , Text
"\951" )
  , ( Text
"gamma" , Bool
False , Text
"\947" )
  , ( Text
"iota" , Bool
False , Text
"\953" )
  , ( Text
"kai" , Bool
False , Text
"\983" )
  , ( Text
"kappa" , Bool
False , Text
"\954" )
  , ( Text
"kappa.alt" , Bool
False , Text
"\1008" )
  , ( Text
"lambda" , Bool
False , Text
"\955" )
  , ( Text
"mu" , Bool
False , Text
"\956" )
  , ( Text
"nu" , Bool
False , Text
"\957" )
  , ( Text
"ohm" , Bool
False , Text
"\8486" )
  , ( Text
"ohm.inv" , Bool
False , Text
"\8487" )
  , ( Text
"omega" , Bool
False , Text
"\969" )
  , ( Text
"omicron" , Bool
False , Text
"\959" )
  , ( Text
"phi" , Bool
False , Text
"\966" )
  , ( Text
"phi.alt" , Bool
False , Text
"\981" )
  , ( Text
"pi" , Bool
False , Text
"\960" )
  , ( Text
"pi.alt" , Bool
False , Text
"\982" )
  , ( Text
"psi" , Bool
False , Text
"\968" )
  , ( Text
"rho" , Bool
False , Text
"\961" )
  , ( Text
"rho.alt" , Bool
False , Text
"\1009" )
  , ( Text
"sigma" , Bool
False , Text
"\963" )
  , ( Text
"sigma.alt" , Bool
False , Text
"\962" )
  , ( Text
"tau" , Bool
False , Text
"\964" )
  , ( Text
"theta" , Bool
False , Text
"\952" )
  , ( Text
"theta.alt" , Bool
False , Text
"\977" )
  , ( Text
"upsilon" , Bool
False , Text
"\965" )
  , ( Text
"xi" , Bool
False , Text
"\958" )
  , ( Text
"zeta" , Bool
False , Text
"\950" )
  , ( Text
"Alpha" , Bool
False , Text
"\913" )
  , ( Text
"Beta" , Bool
False , Text
"\914" )
  , ( Text
"Chi" , Bool
False , Text
"\935" )
  , ( Text
"Delta" , Bool
False , Text
"\916" )
  , ( Text
"Epsilon" , Bool
False , Text
"\917" )
  , ( Text
"Eta" , Bool
False , Text
"\919" )
  , ( Text
"Gamma" , Bool
False , Text
"\915" )
  , ( Text
"Iota" , Bool
False , Text
"\921" )
  , ( Text
"Kai" , Bool
False , Text
"\975" )
  , ( Text
"Kappa" , Bool
False , Text
"\922" )
  , ( Text
"Lambda" , Bool
False , Text
"\923" )
  , ( Text
"Mu" , Bool
False , Text
"\924" )
  , ( Text
"Nu" , Bool
False , Text
"\925" )
  , ( Text
"Omega" , Bool
False , Text
"\937" )
  , ( Text
"Omicron" , Bool
False , Text
"\927" )
  , ( Text
"Phi" , Bool
False , Text
"\934" )
  , ( Text
"Pi" , Bool
False , Text
"\928" )
  , ( Text
"Psi" , Bool
False , Text
"\936" )
  , ( Text
"Rho" , Bool
False , Text
"\929" )
  , ( Text
"Sigma" , Bool
False , Text
"\931" )
  , ( Text
"Tau" , Bool
False , Text
"\932" )
  , ( Text
"Theta" , Bool
False , Text
"\920" )
  , ( Text
"Upsilon" , Bool
False , Text
"\933" )
  , ( Text
"Xi" , Bool
False , Text
"\926" )
  , ( Text
"Zeta" , Bool
False , Text
"\918" )
  , ( Text
"aleph" , Bool
False , Text
"\1488" )
  , ( Text
"alef" , Bool
False , Text
"\1488" )
  , ( Text
"beth" , Bool
False , Text
"\1489" )
  , ( Text
"bet" , Bool
False , Text
"\1489" )
  , ( Text
"gimmel" , Bool
False , Text
"\1490" )
  , ( Text
"gimel" , Bool
False , Text
"\1490" )
  , ( Text
"daleth" , Bool
False , Text
"\1491" )
  , ( Text
"dalet" , Bool
False , Text
"\1491" )
  , ( Text
"shin" , Bool
False , Text
"\1513" )
  , ( Text
"AA" , Bool
False , Text
"\120120" )
  , ( Text
"BB" , Bool
False , Text
"\120121" )
  , ( Text
"CC" , Bool
False , Text
"\8450" )
  , ( Text
"DD" , Bool
False , Text
"\120123" )
  , ( Text
"EE" , Bool
False , Text
"\120124" )
  , ( Text
"FF" , Bool
False , Text
"\120125" )
  , ( Text
"GG" , Bool
False , Text
"\120126" )
  , ( Text
"HH" , Bool
False , Text
"\8461" )
  , ( Text
"II" , Bool
False , Text
"\120128" )
  , ( Text
"JJ" , Bool
False , Text
"\120129" )
  , ( Text
"KK" , Bool
False , Text
"\120130" )
  , ( Text
"LL" , Bool
False , Text
"\120131" )
  , ( Text
"MM" , Bool
False , Text
"\120132" )
  , ( Text
"NN" , Bool
False , Text
"\8469" )
  , ( Text
"OO" , Bool
False , Text
"\120134" )
  , ( Text
"PP" , Bool
False , Text
"\8473" )
  , ( Text
"QQ" , Bool
False , Text
"\8474" )
  , ( Text
"RR" , Bool
False , Text
"\8477" )
  , ( Text
"SS" , Bool
False , Text
"\120138" )
  , ( Text
"TT" , Bool
False , Text
"\120139" )
  , ( Text
"UU" , Bool
False , Text
"\120140" )
  , ( Text
"VV" , Bool
False , Text
"\120141" )
  , ( Text
"WW" , Bool
False , Text
"\120142" )
  , ( Text
"XX" , Bool
False , Text
"\120143" )
  , ( Text
"YY" , Bool
False , Text
"\120144" )
  , ( Text
"ZZ" , Bool
False , Text
"\8484" )
  , ( Text
"ell" , Bool
False , Text
"\8467" )
  , ( Text
"planck" , Bool
False , Text
"\8462" )
  , ( Text
"planck.reduce" , Bool
False , Text
"\8463" )
  , ( Text
"angstrom" , Bool
False , Text
"\8491" )
  , ( Text
"kelvin" , Bool
False , Text
"\8490" )
  , ( Text
"Re" , Bool
False , Text
"\8476" )
  , ( Text
"Im" , Bool
False , Text
"\8465" )
  , ( Text
"dotless.i" , Bool
False , Text
"\120484" )
  , ( Text
"dotless.j" , Bool
False , Text
"\120485" )
  ]