{-# LANGUAGE OverloadedStrings #-}
module Language.Haskell.Liquid.CSS where

import Data.Text (Text)
import qualified Data.Text as Text

syntax :: Text
syntax :: Text
syntax = [Text] -> Text
Text.unlines
  [ Text
".hs-linenum {"
  , Text
"  color: #B2B2B2;"
  , Text
"  font-style: italic;"
  , Text
"}"
  , Text
""
  , Text
".hs-error {"
  , Text
"  background-color: #FF8585 ;"
  , Text
"}"
  , Text
""
  , Text
".hs-keyglyph {"
  , Text
"  color: #007020"
  , Text
"}"
  , Text
""
  , Text
".hs-keyword {"
  , Text
"  color: #007020;"
  , Text
"  // font-weight: bold;"
  , Text
"}"
  , Text
""
  , Text
".hs-comment, .hs-comment a {color: green;}"
  , Text
""
  , Text
".hs-str, .hs-chr {color: teal;}"
  , Text
""
  , Text
".hs-conid { "
  , Text
"  color: #902000;   /* color: #00FFFF; color: #0E84B5; */"
  , Text
"  //font-weight: bold;  "
  , Text
"}"
  , Text
""
  , Text
".hs-definition { "
  , Text
"  color: #06287E "
  , Text
"  /* font-weight: bold; */ "
  , Text
"}"
  , Text
""
  , Text
".hs-varid, .hs-varop, .hs-layout {"
  , Text
"  color: black; "
  , Text
"}"
  , Text
""
  , Text
".hs-num {"
  , Text
"  color: #40A070;"
  , Text
"}"
  , Text
""
  , Text
".hs-conop {"
  , Text
"  color: #902000; "
  , Text
"}"
  , Text
""
  , Text
".hs-cpp {"
  , Text
"  color: orange;"
  , Text
"}"
  , Text
""
  , Text
".hs-sel  {}"
  , Text
""
  , Text
"a.annot {"
  , Text
"  position:relative; "
  , Text
"  color:#000;"
  , Text
"  text-decoration:none; "
  , Text
"  white-space: pre; "
  , Text
"}"
  , Text
""
  , Text
"a.annot:hover { "
  , Text
"  z-index:25; "
  , Text
"  background-color: #D8D8D8;"
  , Text
"}"
  , Text
""
  , Text
"a.annot span.annottext{display: none}"
  , Text
""
  , Text
"a.annot:hover span.annottext{ "
  , Text
"  "
  , Text
"  border-radius: 5px 5px;"
  , Text
"  "
  , Text
"  -moz-border-radius: 5px; "
  , Text
"  -webkit-border-radius: 5px; "
  , Text
"  "
  , Text
"  box-shadow: 5px 5px 5px rgba(0, 0, 0, 0.1); "
  , Text
"  -webkit-box-shadow: 5px 5px rgba(0, 0, 0, 0.1);"
  , Text
"  -moz-box-shadow: 5px 5px rgba(0, 0, 0, 0.1); "
  , Text
""
  , Text
"  white-space:pre;"
  , Text
"  display:block;"
  , Text
"  position: absolute; "
  , Text
"  left: 1em; top: 2em; "
  , Text
"  z-index: 99;"
  , Text
"  margin-left: 5; "
  , Text
"  background: #FFFFAA; "
  , Text
"  border: 3px solid #FFAD33;"
  , Text
"  padding: 0.8em 1em;"
  , Text
"}"
  , Text
""
  , Text
"code {"
  , Text
"   /* font-weight: bold; */"
  , Text
"   background-color: rgb(250, 250, 250);"
  , Text
"   border: 1px solid rgb(200, 200, 200);"
  , Text
"   padding-left: 4px;"
  , Text
"   padding-right: 4px;"
  , Text
"}"
  , Text
""
  , Text
"pre {"
  , Text
"  background-color: #f0f0f0;"
  , Text
"  border-top: 1px solid #ccc;"
  , Text
"  border-bottom: 1px solid #ccc;"
  , Text
"  padding: 5px;"
  , Text
"  // font-size: 120%;"
  , Text
"  // font-family: Bitstream Vera Sans Mono,monospace;"
  , Text
"  display: block;"
  , Text
"  overflow: visible;"
  , Text
"}"
  ]