Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Pictures
Synopsis
- type Picture = [[Char]]
- horse :: Picture
- white :: Picture
- black :: [String]
- printPicture :: Picture -> IO ()
- flipV :: Picture -> Picture
- flipH :: Picture -> Picture
- rotate :: Picture -> Picture
- above :: Picture -> Picture -> Picture
- beside :: Picture -> Picture -> Picture
- superimpose :: Picture -> Picture -> Picture
- combine :: Char -> Char -> Char
- invertColour :: Picture -> Picture
- invert :: Char -> Char
- prop_rotate :: Picture -> Bool
- prop_flipV :: Picture -> Bool
- prop_flipH :: Picture -> Bool
- test_rotate :: Bool
- test_flipV :: Bool
- test_flipH :: Bool
- prop_AboveFlipV :: Picture -> Picture -> Bool
- prop_AboveFlipH :: Picture -> Picture -> Bool
- propAboveBeside1 :: Picture -> Picture -> Picture -> Picture -> Bool
- propAboveBeside2 :: Picture -> Picture -> Bool
- propAboveBeside3 :: Picture -> Picture -> Bool
- propAboveBeside3Correct :: [[Char]] -> [[Char]] -> Property
- notEmpty :: Eq a => [a] -> Bool
- rectangular :: (Eq (t a), Foldable t) => [t a] -> Bool
- height :: Picture -> Int
- width :: Picture -> Int
- size :: Picture -> (Int, Int)
- propAboveBesideFull :: [[Char]] -> [[Char]] -> [[Char]] -> [[Char]] -> Property
- prop_1 :: Property
- prop_2 :: Property
- genChar :: Gen Char
- genList :: Int -> Gen a -> Gen [a]
- genSizedPicture :: Int -> Int -> Gen [String]
- genPicture :: Gen [String]
- genFourPictures :: Gen ([String], [String], [String], [String])
- prop_AboveBeside :: Property
Documentation
printPicture :: Picture -> IO () Source #
^^^^^^^^^^^^^^^^^^^^^^^^^^^
invertColour :: Picture -> Picture Source #
prop_rotate :: Picture -> Bool Source #
prop_flipV :: Picture -> Bool Source #
prop_flipH :: Picture -> Bool Source #
test_rotate :: Bool Source #
test_flipV :: Bool Source #
test_flipH :: Bool Source #
genPicture :: Gen [String] Source #