Skip to content

Instantly share code, notes, and snippets.

@pwm
pwm / Tag.hs
Last active June 21, 2019 10:06
Type level tagging
{-# LANGUAGE DerivingVia #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE TypeApplications #-}
module Tag where
newtype Tag t a = MkTag { unTag :: a } deriving (Eq, Ord, Show) via a
----
@pwm
pwm / Order.php
Created March 14, 2019 09:52
S-Flow - Event sourcing example
<?php
declare(strict_types=1);
final class Order
{
/** @var Event */
private $events;
/** @var State */
private $state;
@pwm
pwm / FSM.hs
Last active February 19, 2019 15:32
Basic FSM
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
module FSM
( FooEvent(..)
, FooState(..)
, Foo()
, mkFoo
, trFoo
, getFooEvents
@pwm
pwm / BT.hs
Last active February 11, 2019 13:58
Binary tree traversals using left and right folds
module BT where
data T a = E | L a | N a (T a) (T a) deriving Show
-- inorder foldr
inor :: (a -> b -> b) -> b -> T a -> b
inor _ v E = v
inor f v (L a) = f a v
inor f v (N a l r) = inor f (f a (inor f v r)) l
@pwm
pwm / auto_state.hs
Last active January 9, 2019 22:46
state stuff
{-# LANGUAGE DeriveTraversable #-}
module AS where
import Control.Monad.Trans.State.Strict
data T a = L a | N (T a) (T a)
deriving (Eq, Show, Functor, Foldable, Traversable)
labelTree :: T a -> (T (a, Int), Int)
@pwm
pwm / zipper.hs
Created November 18, 2018 20:00
Zipper
data Tree a = Empty | Node a (Tree a) (Tree a) deriving (Show)
data Crumb a = LeftCrumb a (Tree a) | RightCrumb a (Tree a) deriving (Show)
type Breadcrumbs a = [Crumb a]
type Zipper a = (Tree a, Breadcrumbs a)
goLeft :: Zipper a -> Zipper a
goLeft (Node x l r, bs) = (l, LeftCrumb x r:bs)
goRight :: Zipper a -> Zipper a
goRight (Node x l r, bs) = (r, RightCrumb x l:bs)
@pwm
pwm / Sing.hs
Last active October 25, 2019 16:52
Singletons
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE KindSignatures #-}
{-# LANGUAGE GADTs #-}
{-# LANGUAGE TypeFamilies #-}
module Sing where
data Broker = B1 | B2 | B3 deriving (Show)
data PolicyB1 = PB1 deriving (Show)
@pwm
pwm / keybase.md
Created October 26, 2018 10:11
keybase.md

Keybase proof

I hereby claim:

  • I am pwm on github.
  • I am zsoltszende (https://keybase.io/zsoltszende) on keybase.
  • I have a public key ASD_UEOrGftSbuEnWfL6BQhMQoZXAHl40-Mxv-8m3dtj5go

To claim this, I am signing this object:

@pwm
pwm / cps_fact.hs
Created October 16, 2018 20:41
Calculating factorial in CPS
fact :: Int -> (Int -> IO ()) -> IO ()
fact n f
| n == 0 = f 1
| otherwise = fact (n - 1) (\x -> f (n * x))
main :: IO ()
main = fact 5 (\x -> print x)
@pwm
pwm / eval.php
Created September 23, 2018 19:46
Simple evaluator
<?php
declare(strict_types=1);
interface Expr {
public function e(Evaluator $eval);
public function unbox();
}
abstract class LRExpr implements Expr {
private $l;