{-# LANGUAGE ScopedTypeVariables, OverloadedStrings #-}
module Text.TeXMath.Shared
  ( getMMLType
  , getTextType
  , getLaTeXTextCommand
  , getScalerCommand
  , getScalerValue
  , scalers
  , getSpaceWidth
  , getSpaceChars
  , getDiacriticalCommand
  , diacriticals
  , getOperator
  , readLength
  , fixTree
  , isEmpty
  , empty
  , handleDownup
  ) where
import Text.TeXMath.Types
import Text.TeXMath.TeX
import qualified Data.Map as M
import qualified Data.Set as Set
import qualified Data.Text as T
import Data.Maybe (fromMaybe)
import Data.Ratio ((%))
import Data.List (sort)
import Control.Monad (guard)
import Text.Parsec (Parsec, parse, getInput, digit, char, many1, option)
import Data.Generics (everywhere, mkT)
removeNesting :: Exp -> Exp
removeNesting :: Exp -> Exp
removeNesting (EDelimited Text
o Text
c [Right (EDelimited Text
"" Text
"" [InEDelimited]
xs)]) = Text -> Text -> [InEDelimited] -> Exp
EDelimited Text
o Text
c [InEDelimited]
xs
removeNesting (EDelimited Text
"" Text
"" [InEDelimited
x]) = forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either (TeXSymbolType -> Text -> Exp
ESymbol TeXSymbolType
Ord) forall a. a -> a
id InEDelimited
x
removeNesting (EGrouped [Exp
x]) = Exp
x
removeNesting Exp
x = Exp
x
removeEmpty :: [Exp] -> [Exp]
removeEmpty :: [Exp] -> [Exp]
removeEmpty [Exp]
xs = forall a. (a -> Bool) -> [a] -> [a]
filter (Bool -> Bool
not forall b c a. (b -> c) -> (a -> b) -> a -> c
. Exp -> Bool
isEmpty) [Exp]
xs
empty :: Exp
empty :: Exp
empty = [Exp] -> Exp
EGrouped []
isEmpty :: Exp -> Bool
isEmpty :: Exp -> Bool
isEmpty (EGrouped []) = Bool
True
isEmpty Exp
_ = Bool
False
fixTree :: Exp -> Exp
fixTree :: Exp -> Exp
fixTree = (forall a. Data a => a -> a) -> forall a. Data a => a -> a
everywhere (forall a b. (Typeable a, Typeable b) => (b -> b) -> a -> a
mkT Exp -> Exp
removeNesting) forall b c a. (b -> c) -> (a -> b) -> a -> c
. (forall a. Data a => a -> a) -> forall a. Data a => a -> a
everywhere (forall a b. (Typeable a, Typeable b) => (b -> b) -> a -> a
mkT [Exp] -> [Exp]
removeEmpty)
getMMLType :: TextType -> T.Text
getMMLType :: TextType -> Text
getMMLType TextType
t = forall a. a -> Maybe a -> a
fromMaybe Text
"normal" (forall a b. (a, b) -> a
fst forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall k a. Ord k => k -> Map k a -> Maybe a
M.lookup TextType
t Map TextType (Text, Text)
textTypesMap)
getLaTeXTextCommand :: Env -> TextType -> T.Text
getLaTeXTextCommand :: Env -> TextType -> Text
getLaTeXTextCommand Env
e TextType
t =
  let textCmd :: Text
textCmd = forall a. a -> Maybe a -> a
fromMaybe Text
"\\mathrm"
                  (forall a b. (a, b) -> b
snd forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall k a. Ord k => k -> Map k a -> Maybe a
M.lookup TextType
t Map TextType (Text, Text)
textTypesMap) in
  if Text -> Env -> Bool
textPackage Text
textCmd Env
e
    then Text
textCmd
    else forall a. a -> Maybe a -> a
fromMaybe Text
"\\mathrm" (forall k a. Ord k => k -> Map k a -> Maybe a
M.lookup Text
textCmd Map Text Text
alts)
getTextType :: T.Text -> TextType
getTextType :: Text -> TextType
getTextType Text
s = forall a. a -> Maybe a -> a
fromMaybe TextType
TextNormal (forall k a. Ord k => k -> Map k a -> Maybe a
M.lookup Text
s Map Text TextType
revTextTypesMap)
getScalerCommand :: Rational -> Maybe T.Text
getScalerCommand :: Rational -> Maybe Text
getScalerCommand Rational
width =
  case forall a. Ord a => [a] -> [a]
sort [ (Rational
w, Text
cmd) | (Text
cmd, Rational
w) <- [(Text, Rational)]
scalers, Rational
w forall a. Ord a => a -> a -> Bool
>= Rational
width ] of
       ((Rational
_,Text
cmd):[(Rational, Text)]
_) -> forall a. a -> Maybe a
Just Text
cmd
       [(Rational, Text)]
_           -> forall a. Maybe a
Nothing
  
  
getScalerValue :: T.Text -> Maybe Rational
getScalerValue :: Text -> Maybe Rational
getScalerValue Text
command = forall a b. Eq a => a -> [(a, b)] -> Maybe b
lookup Text
command [(Text, Rational)]
scalers
getDiacriticalCommand  :: Position -> T.Text -> Maybe T.Text
getDiacriticalCommand :: Position -> Text -> Maybe Text
getDiacriticalCommand Position
pos Text
symbol = do
  Text
command <- forall k a. Ord k => k -> Map k a -> Maybe a
M.lookup Text
symbol Map Text Text
diaMap
  forall (f :: * -> *). Alternative f => Bool -> f ()
guard (Bool -> Bool
not forall a b. (a -> b) -> a -> b
$ Text
command forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
`elem` Env
unavailable)
  let below :: Bool
below = Text
command forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
`elem` Env
under
  case Position
pos of
    Position
Under -> if Bool
below then forall a. a -> Maybe a
Just Text
command else forall a. Maybe a
Nothing
    Position
Over -> if Bool -> Bool
not Bool
below then forall a. a -> Maybe a
Just Text
command else forall a. Maybe a
Nothing
  where
    diaMap :: Map Text Text
diaMap = forall k a. Ord k => [(k, a)] -> Map k a
M.fromList [(Text, Text)]
diacriticals
getOperator :: Exp -> Maybe TeX
getOperator :: Exp -> Maybe TeX
getOperator Exp
op = forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap Text -> TeX
ControlSeq forall a b. (a -> b) -> a -> b
$ forall k a. Ord k => k -> Map k a -> Maybe a
M.lookup Exp
op Map Exp Text
operators
operators :: M.Map Exp T.Text
operators :: Map Exp Text
operators = forall k a. Ord k => [(k, a)] -> Map k a
M.fromList
           [ (Text -> Exp
EMathOperator Text
"arccos", Text
"\\arccos")
           , (Text -> Exp
EMathOperator Text
"arcsin", Text
"\\arcsin")
           , (Text -> Exp
EMathOperator Text
"arctan", Text
"\\arctan")
           , (Text -> Exp
EMathOperator Text
"arg", Text
"\\arg")
           , (Text -> Exp
EMathOperator Text
"cos", Text
"\\cos")
           , (Text -> Exp
EMathOperator Text
"cosh", Text
"\\cosh")
           , (Text -> Exp
EMathOperator Text
"cot", Text
"\\cot")
           , (Text -> Exp
EMathOperator Text
"coth", Text
"\\coth")
           , (Text -> Exp
EMathOperator Text
"csc", Text
"\\csc")
           , (Text -> Exp
EMathOperator Text
"deg", Text
"\\deg")
           , (Text -> Exp
EMathOperator Text
"det", Text
"\\det")
           , (Text -> Exp
EMathOperator Text
"dim", Text
"\\dim")
           , (Text -> Exp
EMathOperator Text
"exp", Text
"\\exp")
           , (Text -> Exp
EMathOperator Text
"gcd", Text
"\\gcd")
           , (Text -> Exp
EMathOperator Text
"hom", Text
"\\hom")
           , (Text -> Exp
EMathOperator Text
"inf", Text
"\\inf")
           , (Text -> Exp
EMathOperator Text
"ker", Text
"\\ker")
           , (Text -> Exp
EMathOperator Text
"lg", Text
"\\lg")
           , (Text -> Exp
EMathOperator Text
"lim", Text
"\\lim")
           , (Text -> Exp
EMathOperator Text
"liminf", Text
"\\liminf")
           , (Text -> Exp
EMathOperator Text
"limsup", Text
"\\limsup")
           , (Text -> Exp
EMathOperator Text
"ln", Text
"\\ln")
           , (Text -> Exp
EMathOperator Text
"log", Text
"\\log")
           , (Text -> Exp
EMathOperator Text
"max", Text
"\\max")
           , (Text -> Exp
EMathOperator Text
"min", Text
"\\min")
           , (Text -> Exp
EMathOperator Text
"Pr", Text
"\\Pr")
           , (Text -> Exp
EMathOperator Text
"sec", Text
"\\sec")
           , (Text -> Exp
EMathOperator Text
"sin", Text
"\\sin")
           , (Text -> Exp
EMathOperator Text
"sinh", Text
"\\sinh")
           , (Text -> Exp
EMathOperator Text
"sup", Text
"\\sup")
           , (Text -> Exp
EMathOperator Text
"tan", Text
"\\tan")
           , (Text -> Exp
EMathOperator Text
"tanh", Text
"\\tanh") ]
readLength :: T.Text -> Maybe Rational
readLength :: Text -> Maybe Rational
readLength Text
s = do
  (Rational
n, Text
unit) <- case (forall s t a.
Stream s Identity t =>
Parsec s () a -> [Char] -> s -> Either ParseError a
parse Parsec Text () (Rational, Text)
parseLength [Char]
"" Text
s) of
                  Left ParseError
_ -> forall a. Maybe a
Nothing
                  Right (Rational, Text)
v -> forall a. a -> Maybe a
Just (Rational, Text)
v
  (Rational
n forall a. Num a => a -> a -> a
*) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Text -> Maybe Rational
unitToMultiplier Text
unit
parseLength :: Parsec T.Text () (Rational, T.Text)
parseLength :: Parsec Text () (Rational, Text)
parseLength = do
    [Char]
neg <- forall s (m :: * -> *) t a u.
Stream s m t =>
a -> ParsecT s u m a -> ParsecT s u m a
option [Char]
"" ((forall a. a -> [a] -> [a]
:[]) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall s (m :: * -> *) u.
Stream s m Char =>
Char -> ParsecT s u m Char
char Char
'-')
    [Char]
dec <- forall s (m :: * -> *) t u a.
Stream s m t =>
ParsecT s u m a -> ParsecT s u m [a]
many1 forall s (m :: * -> *) u. Stream s m Char => ParsecT s u m Char
digit
    [Char]
frac <- forall s (m :: * -> *) t a u.
Stream s m t =>
a -> ParsecT s u m a -> ParsecT s u m a
option [Char]
"" ((:) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall s (m :: * -> *) u.
Stream s m Char =>
Char -> ParsecT s u m Char
char Char
'.' forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> forall s (m :: * -> *) t u a.
Stream s m t =>
ParsecT s u m a -> ParsecT s u m [a]
many1 forall s (m :: * -> *) u. Stream s m Char => ParsecT s u m Char
digit)
    Text
unit <- forall (m :: * -> *) s u. Monad m => ParsecT s u m s
getInput
    
    case forall a. Read a => ReadS a
reads ([Char]
neg forall a. [a] -> [a] -> [a]
++ [Char]
dec forall a. [a] -> [a] -> [a]
++ [Char]
frac) of
       [(Double
n :: Double, [])] -> forall (m :: * -> *) a. Monad m => a -> m a
return (forall a b. (RealFrac a, Integral b) => a -> b
round (Double
n forall a. Num a => a -> a -> a
* Double
18) forall a. Integral a => a -> a -> Ratio a
% Integer
18, Text
unit)
       [(Double, [Char])]
_ -> forall (m :: * -> *) a. MonadFail m => [Char] -> m a
fail forall a b. (a -> b) -> a -> b
$ [Char]
"Could not parse " forall a. [a] -> [a] -> [a]
++ [Char]
neg forall a. [a] -> [a] -> [a]
++ [Char]
dec forall a. [a] -> [a] -> [a]
++ [Char]
frac forall a. [a] -> [a] -> [a]
++ [Char]
" as Double"
textTypesMap :: M.Map TextType (T.Text, T.Text)
textTypesMap :: Map TextType (Text, Text)
textTypesMap = forall k a. Ord k => [(k, a)] -> Map k a
M.fromList [(TextType, (Text, Text))]
textTypes
revTextTypesMap :: M.Map T.Text TextType
revTextTypesMap :: Map Text TextType
revTextTypesMap = forall k a. Ord k => [(k, a)] -> Map k a
M.fromList forall a b. (a -> b) -> a -> b
$ forall a b. (a -> b) -> [a] -> [b]
map (\(TextType
k, (Text
v,Text
_)) -> (Text
v,TextType
k)) [(TextType, (Text, Text))]
textTypes
textTypes :: [(TextType, (T.Text, T.Text))]
textTypes :: [(TextType, (Text, Text))]
textTypes =
  [ ( TextType
TextNormal       , (Text
"normal", Text
"\\mathrm"))
  , ( TextType
TextBold         , (Text
"bold", Text
"\\mathbf"))
  , ( TextType
TextItalic       , (Text
"italic",Text
"\\mathit"))
  , ( TextType
TextMonospace    , (Text
"monospace",Text
"\\mathtt"))
  , ( TextType
TextSansSerif    , (Text
"sans-serif",Text
"\\mathsf"))
  , ( TextType
TextDoubleStruck , (Text
"double-struck",Text
"\\mathbb"))
  , ( TextType
TextScript       , (Text
"script",Text
"\\mathcal"))
  , ( TextType
TextFraktur      , (Text
"fraktur",Text
"\\mathfrak"))
  , ( TextType
TextBoldItalic          , (Text
"bold-italic",Text
"\\mathbfit"))
  , ( TextType
TextSansSerifBold       , (Text
"bold-sans-serif",Text
"\\mathbfsfup"))
  , ( TextType
TextSansSerifBoldItalic , (Text
"sans-serif-bold-italic",Text
"\\mathbfsfit"))
  , ( TextType
TextBoldScript          , (Text
"bold-script",Text
"\\mathbfscr"))
  , ( TextType
TextBoldFraktur         , (Text
"bold-fraktur",Text
"\\mathbffrak"))
  , ( TextType
TextSansSerifItalic     , (Text
"sans-serif-italic",Text
"\\mathsfit")) ]
unicodeMath, base :: Set.Set T.Text
unicodeMath :: Set Text
unicodeMath = forall a. Ord a => [a] -> Set a
Set.fromList
  [Text
"\\mathbfit", Text
"\\mathbfsfup", Text
"\\mathbfsfit", Text
"\\mathbfscr",
   Text
"\\mathbffrak", Text
"\\mathsfit"]
base :: Set Text
base = forall a. Ord a => [a] -> Set a
Set.fromList
  [Text
"\\mathbb", Text
"\\mathrm", Text
"\\mathbf", Text
"\\mathit", Text
"\\mathsf",
   Text
"\\mathtt", Text
"\\mathfrak", Text
"\\mathcal"]
alts :: M.Map T.Text T.Text
alts :: Map Text Text
alts = forall k a. Ord k => [(k, a)] -> Map k a
M.fromList
  [ (Text
"\\mathbfit", Text
"\\mathbf")
  , (Text
"\\mathbfsfup", Text
"\\mathbf")
  , (Text
"\\mathbfsfit", Text
"\\mathbf")
  , (Text
"\\mathbfscr", Text
"\\mathcal")
  , (Text
"\\mathbffrak", Text
"\\mathfrak")
  , (Text
"\\mathsfit", Text
"\\mathsf")
  ]
textPackage :: T.Text -> [T.Text] -> Bool
textPackage :: Text -> Env -> Bool
textPackage Text
s Env
e
  | Text
s forall a. Ord a => a -> Set a -> Bool
`Set.member` Set Text
unicodeMath = Text
"unicode-math" forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
`elem` Env
e
  | Text
s forall a. Ord a => a -> Set a -> Bool
`Set.member` Set Text
base    = Bool
True
  | Bool
otherwise = Bool
True
scalers :: [(T.Text, Rational)]
scalers :: [(Text, Rational)]
scalers =
          [ (Text
"\\bigg", Rational
widthbigg)
          , (Text
"\\Bigg", Rational
widthBigg)
          , (Text
"\\big", Rational
widthbig)
          , (Text
"\\Big", Rational
widthBig)
          , (Text
"\\biggr", Rational
widthbigg)
          , (Text
"\\Biggr", Rational
widthBigg)
          , (Text
"\\bigr", Rational
widthbig)
          , (Text
"\\Bigr", Rational
widthBig)
          , (Text
"\\biggl", Rational
widthbigg)
          , (Text
"\\Biggl", Rational
widthBigg)
          , (Text
"\\bigl", Rational
widthbig)]
  where widthbig :: Rational
widthbig = Rational
6 forall a. Fractional a => a -> a -> a
/ Rational
5
        widthBig :: Rational
widthBig = Rational
9 forall a. Fractional a => a -> a -> a
/ Rational
5
        widthbigg :: Rational
widthbigg = Rational
12 forall a. Fractional a => a -> a -> a
/ Rational
5
        widthBigg :: Rational
widthBigg = Rational
3
getSpaceWidth :: Char -> Maybe Rational
getSpaceWidth :: Char -> Maybe Rational
getSpaceWidth Char
' '      = forall a. a -> Maybe a
Just (Rational
4forall a. Fractional a => a -> a -> a
/Rational
18)
getSpaceWidth Char
'\xA0'   = forall a. a -> Maybe a
Just (Rational
4forall a. Fractional a => a -> a -> a
/Rational
18)
getSpaceWidth Char
'\x2000' = forall a. a -> Maybe a
Just (Rational
1forall a. Fractional a => a -> a -> a
/Rational
2)
getSpaceWidth Char
'\x2001' = forall a. a -> Maybe a
Just Rational
1
getSpaceWidth Char
'\x2002' = forall a. a -> Maybe a
Just (Rational
1forall a. Fractional a => a -> a -> a
/Rational
2)
getSpaceWidth Char
'\x2003' = forall a. a -> Maybe a
Just Rational
1
getSpaceWidth Char
'\x2004' = forall a. a -> Maybe a
Just (Rational
1forall a. Fractional a => a -> a -> a
/Rational
3)
getSpaceWidth Char
'\x2005' = forall a. a -> Maybe a
Just (Rational
4forall a. Fractional a => a -> a -> a
/Rational
18)
getSpaceWidth Char
'\x2006' = forall a. a -> Maybe a
Just (Rational
1forall a. Fractional a => a -> a -> a
/Rational
6)
getSpaceWidth Char
'\x2007' = forall a. a -> Maybe a
Just (Rational
1forall a. Fractional a => a -> a -> a
/Rational
3) 
getSpaceWidth Char
'\x2008' = forall a. a -> Maybe a
Just (Rational
1forall a. Fractional a => a -> a -> a
/Rational
6) 
getSpaceWidth Char
'\x2009' = forall a. a -> Maybe a
Just (Rational
1forall a. Fractional a => a -> a -> a
/Rational
6)
getSpaceWidth Char
'\x200A' = forall a. a -> Maybe a
Just (Rational
1forall a. Fractional a => a -> a -> a
/Rational
9)
getSpaceWidth Char
'\x200B' = forall a. a -> Maybe a
Just Rational
0
getSpaceWidth Char
'\x202F' = forall a. a -> Maybe a
Just (Rational
3forall a. Fractional a => a -> a -> a
/Rational
18)
getSpaceWidth Char
'\x205F' = forall a. a -> Maybe a
Just (Rational
4forall a. Fractional a => a -> a -> a
/Rational
18)
getSpaceWidth Char
_        = forall a. Maybe a
Nothing
getSpaceChars :: Rational -> T.Text
getSpaceChars :: Rational -> Text
getSpaceChars Rational
r
  | Int
n forall a. Ord a => a -> a -> Bool
< Int
0 = Text
"\x200B" 
  | Bool
otherwise = forall {t}. (Ord t, Fractional t) => t -> Text
fracSpaces Rational
f forall a. Semigroup a => a -> a -> a
<> Int -> Text
emQuads Int
n
  where
    (Int
n, Rational
f) = forall a b. (RealFrac a, Integral b) => a -> (b, a)
properFraction Rational
r
    emQuads :: Int -> Text
emQuads Int
x = Int -> Text -> Text
T.replicate Int
x Text
"\x2001"
    fracSpaces :: t -> Text
fracSpaces t
x
      | t
x forall a. Ord a => a -> a -> Bool
<= t
2forall a. Fractional a => a -> a -> a
/t
18 = Text
"\x200A"
      | t
x forall a. Ord a => a -> a -> Bool
<= t
3forall a. Fractional a => a -> a -> a
/t
18 = Text
"\x2006"
      | t
x forall a. Ord a => a -> a -> Bool
<= t
4forall a. Fractional a => a -> a -> a
/t
18 = Text
"\xA0"   
      | t
x forall a. Ord a => a -> a -> Bool
<= t
5forall a. Fractional a => a -> a -> a
/t
18 = Text
"\x2005"
      | t
x forall a. Ord a => a -> a -> Bool
<= t
7forall a. Fractional a => a -> a -> a
/t
18 = Text
"\x2004"
      | t
x forall a. Ord a => a -> a -> Bool
<= t
9forall a. Fractional a => a -> a -> a
/t
18 = Text
"\x2000"
      | Bool
otherwise = Char -> Text -> Text
T.cons Char
'\x2000' forall a b. (a -> b) -> a -> b
$ t -> Text
fracSpaces (t
x forall a. Num a => a -> a -> a
- (t
1forall a. Fractional a => a -> a -> a
/t
2))
under :: [T.Text]
under :: Env
under = [Text
"\\underbrace", Text
"\\underline", Text
"\\underbar", Text
"\\underbracket"]
unavailable :: [T.Text]
unavailable :: Env
unavailable = [Text
"\\overbracket", Text
"\\underbracket"]
diacriticals :: [(T.Text, T.Text)]
diacriticals :: [(Text, Text)]
diacriticals =
               [ (Text
"\x00B4", Text
"\\acute")
               , (Text
"\x0301", Text
"\\acute")
               , (Text
"\x0060", Text
"\\grave")
               , (Text
"\x0300", Text
"\\grave")
               , (Text
"\x02D8", Text
"\\breve")
               , (Text
"\x0306", Text
"\\breve")
               , (Text
"\x02C7", Text
"\\check")
               , (Text
"\x030C", Text
"\\check")
               , (Text
"\x307", Text
"\\dot")
               , (Text
"\x308", Text
"\\ddot")
               , (Text
"\x20DB", Text
"\\dddot")
               , (Text
"\x20DC", Text
"\\ddddot")
               , (Text
"\x00B0", Text
"\\mathring")
               , (Text
"\x030A", Text
"\\mathring")
               , (Text
"\x20D7", Text
"\\vec")
               , (Text
"\x20D7", Text
"\\overrightarrow")
               , (Text
"\x20D6", Text
"\\overleftarrow")
               , (Text
"\x005E", Text
"\\hat")
               , (Text
"\x02C6", Text
"\\widehat")
               , (Text
"\x0302", Text
"\\widehat")
               , (Text
"\x02DC", Text
"\\widetilde")
               , (Text
"\x0303", Text
"\\tilde")
               , (Text
"\x0303", Text
"\\widetilde")
               , (Text
"\x0304", Text
"\\bar")
               , (Text
"\x203E", Text
"\\bar")
               , (Text
"\x23DE", Text
"\\overbrace")
               , (Text
"\x23B4", Text
"\\overbracket") 
               , (Text
"\x00AF", Text
"\\overline")
               , (Text
"\x0305", Text
"\\overline")
               , (Text
"\x23DF", Text
"\\underbrace")
               , (Text
"\x23B5", Text
"\\underbracket") 
               , (Text
"\x0332", Text
"\\underline")
               , (Text
"_", Text
"\\underline")
               , (Text
"\x0333", Text
"\\underbar")
               ]
unitToMultiplier :: T.Text -> Maybe Rational
unitToMultiplier :: Text -> Maybe Rational
unitToMultiplier Text
s = forall k a. Ord k => k -> Map k a -> Maybe a
M.lookup Text
s Map Text Rational
units
  where
    units :: Map Text Rational
units = forall k a. Ord k => [(k, a)] -> Map k a
M.fromList  [ ( Text
"pt" , Rational
10)
                        , ( Text
"mm" , (Rational
351forall a. Fractional a => a -> a -> a
/Rational
10))
                        , ( Text
"cm" , (Rational
35forall a. Fractional a => a -> a -> a
/Rational
100))
                        , ( Text
"in" , (Rational
14forall a. Fractional a => a -> a -> a
/Rational
100))
                        , ( Text
"ex" , (Rational
232forall a. Fractional a => a -> a -> a
/Rational
100))
                        , ( Text
"em" , Rational
1)
                        , ( Text
"mu" , Rational
18)
                        , ( Text
"dd" , (Rational
93forall a. Fractional a => a -> a -> a
/Rational
100))
                        , ( Text
"bp" , (Rational
996forall a. Fractional a => a -> a -> a
/Rational
1000))
                        , ( Text
"pc" , (Rational
83forall a. Fractional a => a -> a -> a
/Rational
100)) ]
handleDownup :: DisplayType -> Exp -> Exp
handleDownup :: DisplayType -> Exp -> Exp
handleDownup DisplayType
DisplayInline (EUnder Bool
True Exp
x Exp
y)       = Exp -> Exp -> Exp
ESub Exp
x Exp
y
handleDownup DisplayType
DisplayInline (EOver Bool
True Exp
x Exp
y)        = Exp -> Exp -> Exp
ESuper Exp
x Exp
y
handleDownup DisplayType
DisplayInline (EUnderover Bool
True Exp
x Exp
y Exp
z) = Exp -> Exp -> Exp -> Exp
ESubsup Exp
x Exp
y Exp
z
handleDownup DisplayType
DisplayBlock  (EUnder Bool
True Exp
x Exp
y)       = Bool -> Exp -> Exp -> Exp
EUnder Bool
False Exp
x Exp
y
handleDownup DisplayType
DisplayBlock  (EOver Bool
True Exp
x Exp
y)        = Bool -> Exp -> Exp -> Exp
EOver Bool
False  Exp
x Exp
y
handleDownup DisplayType
DisplayBlock  (EUnderover Bool
True Exp
x Exp
y Exp
z) = Bool -> Exp -> Exp -> Exp -> Exp
EUnderover Bool
False Exp
x Exp
y Exp
z
handleDownup DisplayType
_             Exp
x                       = Exp
x