{-# LANGUAGE TemplateHaskell #-}
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE TypeFamilies #-}
{-# OPTIONS_GHC -Wall -fno-warn-tabs #-}

module Control.Moffy.Samples.Viewable.Text (VText(..)) where

import Control.Moffy.Samples.Event.CalcTextExtents (FontName, FontSize)
import Data.Text (Text)

import Data.Type.Set

import Control.Moffy.Samples.Viewable.Basic

---------------------------------------------------------------------------

-- TEXT

data VText = Text' Color FontName FontSize Position Text deriving Int -> VText -> ShowS
[VText] -> ShowS
VText -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [VText] -> ShowS
$cshowList :: [VText] -> ShowS
show :: VText -> String
$cshow :: VText -> String
showsPrec :: Int -> VText -> ShowS
$cshowsPrec :: Int -> VText -> ShowS
Show
numbered [t| VText |]