module Profiteur.DataFile.Internal where

import Data.String

data DataType = JQueryFile | DataFile FilePath deriving (Int -> DataType -> ShowS
[DataType] -> ShowS
DataType -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DataType] -> ShowS
$cshowList :: [DataType] -> ShowS
show :: DataType -> String
$cshow :: DataType -> String
showsPrec :: Int -> DataType -> ShowS
$cshowsPrec :: Int -> DataType -> ShowS
Show)

instance IsString DataType where
  fromString :: String -> DataType
fromString = String -> DataType
DataFile