aboutsummaryrefslogtreecommitdiffstats
path: root/src/Main.hs
blob: c52ad160cd5d32b71caa5e0c4742585837feb43e (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
module Main where

import Data.Bits
import Test.QuickCheck hiding ((.&.))
import Data.GraphViz
import Data.Graph.Inductive.Example (clr479, dag4)
import Data.Graph.Inductive.Graph
import Data.Graph.Inductive.PatriciaTree

type Input = Bool

data Gate = Nand
          deriving (Show)

data Circuit a = In a
               | Node Gate (Circuit a) (Circuit a)
               deriving (Show)

instance Arbitrary Gate where
  arbitrary = return Nand

instance (Arbitrary a) => Arbitrary (Circuit a) where
  arbitrary = do
    x <- arbitrary
    frequency [(1, return (In x)), (1, arbNode)]
      where
        arbNode = Node <$> arbitrary <*> arbitrary <*> arbitrary

eval :: (Bits a) => Circuit a -> a
eval (In val) = val
eval (Node Nand c1 c2) = complement $ eval c1 .&. eval c2

visualize :: (Show a) => Circuit a -> Gr String String
visualize circ =
  graph Nothing 0 (empty :: Gr String String) circ
  where
    graph parent nl graph circ =
      let newNode str graph = (head $ newNodes 1 graph, str) in
      case (parent, circ) of
        (Nothing, (In val)) ->
          insNode (newNode "IN" graph) graph
        _ ->
          graph

main :: IO ()
--main = sample (arbitrary :: Gen (Circuit Input))
main = preview $ visualize (In True)