Skip to content

Instantly share code, notes, and snippets.

View sordina's full-sized avatar

Lyndon Maydwell sordina

View GitHub Profile
{ name : Text, ip : Text, pageLimit : Integer }
{ access_level : Integer, address : Text }
Sorry, something went wrong. Reload?
Sorry, we cannot display this file.
Sorry, this file is invalid so it cannot be displayed.
module Main where
import Control.Monad.Random.Class
import Algebra.Graph
import Control.Monad
import Data.Maybe
import Lib
main :: IO ()
main = print =<< foo [1..4]
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE TemplateHaskell #-}
import Control.Lens
import Control.Lens.Operators
import Data.List
import Control.Monad
import Control.Monad.State
vec1 = [1 .. 3]
import Test.QuickCheck
f x = x * (-1 ^ x)
f' x = abs x
data OddEven = Odd | Even deriving (Eq, Show, Enum, Bounded)
data PosNeg = Pos | Neg deriving (Eq, Show, Enum, Bounded)
instance Arbitrary OddEven where arbitrary = elements [Odd,Even]
primes :: [Integer]
{-# LANGUAGE TypeFamilies #-}
import Control.Monad.Identity
import Prelude hiding (lookup)
class Applicative f => Naperian f where
type Log f
lookup :: f a -> (Log f -> a)
table :: (Log f -> a) -> f a
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TupleSections #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
-- | A library for checking that the contents of files have changed.
module Text.UniqhashC (changedFiles, main) where
import Conduit
import Control.Exception
Sorry, something went wrong. Reload?
Sorry, we cannot display this file.
Sorry, this file is invalid so it cannot be displayed.