{-|
Module      : Q.Plotting
Description : A collection of plotting tools i found useful.
-}
{-# LANGUAGE OverloadedStrings          #-}
module Q.Plotting where
import qualified Data.Text              as T

colorPairs :: [(T.Text, T.Text)]
colorPairs :: [(Text, Text)]
colorPairs = [(Text, Text)] -> [(Text, Text)]
forall a. [a] -> [a]
cycle [(Text
"#001f3f", Text
"#FF851B"), (Text
"#0074D9", Text
"#FF4136"),(Text
"#7FDBFF", Text
"#85144b"), (Text
"#3D9970", Text
"#B10DC9")]