dmjio
11/21/2015 - 7:24 PM

gistfile1.txt

{-# LANGUAGE OverloadedLists      #-}
{-# LANGUAGE OverloadedStrings    #-}
{-# LANGUAGE FlexibleInstances    #-}
{-# LANGUAGE TypeSynonymInstances #-}
{-# LANGUAGE TypeOperators        #-}
{-# LANGUAGE DeriveGeneric        #-}
{-# LANGUAGE DefaultSignatures    #-}
{-# LANGUAGE FlexibleContexts     #-}
{-# LANGUAGE TemplateHaskell      #-}
module Main where

import Control.Applicative
import GHC.Generics
import Data.Typeable
import Data.Monoid
import qualified Data.Set as S
import Control.Lens hiding (to, from)

data Schema = Schema {
    _schemaName   :: S.Set String
  , _schemaFields :: [(String, TypeRep)]
  } deriving (Show, Eq, Generic)

-- lensies
$(makeLenses ''Schema)

instance Monoid Schema where
  mempty = Schema mempty mempty
  Schema x1 y1 `mappend` Schema x2 y2
    = Schema (x1 <> x2) (y1 <> y2)

class Generic a => Example a where example :: a

class GToSchema f where
  gToSchema :: f a    -- * type rep.
            -> Schema -- * accumulator
            -> Schema -- * final schema

class ToSchema a where
  toSchema :: a -> Schema
  default toSchema :: (Example a, Generic a, GToSchema (Rep a)) => a -> Schema
  toSchema x = gToSchema (from x) mempty

data Person = Person {
    name :: String
  , age  :: Int
  } deriving (Generic)

instance Example Person where
  example = Person "fizruk" 28

instance ToSchema Person

-- Unit
instance GToSchema U1 where
  gToSchema = undefined -- don't need

-- DataType
instance (Datatype d, GToSchema a) => GToSchema (D1 d a) where
  gToSchema m@(M1 x) schema = gToSchema x newSchema
     where
       newSchema = schema & schemaName .~ [ datatypeName m ]

-- Constructors
instance (Constructor i, GToSchema a) => GToSchema (C1 i a) where
  gToSchema m@(M1 x) = gToSchema x
  -- already capturing this info at the dataType (same as Con in this case)
     -- where
     --   newSchema = schema & schemaName .~ conName m

-- Selectors + Values
instance (Typeable a, Selector s) => GToSchema (S1 s (K1 i a)) where
  gToSchema m@(M1 (K1 x)) schema = newSchema
    where
      newSchema = schema & schemaFields %~ (:) (selName m, typeOf x)

-- Sums
instance (GToSchema left, GToSchema right) => GToSchema (left :*: right) where
  gToSchema (l :*: r) schema = gToSchema l schema <> gToSchema r schema

-- Products... I say we don't support these now for the sake of simplicity
instance (GToSchema left, GToSchema right) => GToSchema (left :+: right) where
  gToSchema (L1 x) = gToSchema x
  gToSchema (R1 x) = gToSchema x

-- λ> toSchema (example :: Person)
-- Schema {  _schemaName = fromList ["Person"]
--        ,  _schemaFields = [("name",[Char]),("age",Int)]
--        }