Skip to content

Instantly share code, notes, and snippets.

View Ino4137's full-sized avatar
🤔
hmm

Ino4137

🤔
hmm
View GitHub Profile
@emilypi
emilypi / optics.hs
Last active February 26, 2021 13:39
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE TupleSections #-}
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE TypeInType #-}
{-# LANGUAGE GADTs #-}
module Data.Optics where
class Profunctor p where
@iitalics
iitalics / STLC.agda
Last active October 15, 2018 21:09
Progress & Preservation for Simply Typed Lambda Calculus
open import Level using (0ℓ)
open import Data.Nat as N using (ℕ; suc)
open import Data.Vec as Vc using (Vec; []; _∷_)
open import Data.Fin as Fn using (Fin; suc; zero)
open import Data.Sum using (_⊎_; inj₁; inj₂)
open import Relation.Binary
open import Relation.Binary.PropositionalEquality as P using (_≡_)
open import Data.Fin.Substitution as Sbt using (Sub)
open import Codata.Thunk using (force)
@Icelandjack
Icelandjack / Notation.markdown
Last active July 6, 2019 18:37
Notes on Notation

Non-standard operators I use :) linked to from my twitter profile

I use kind synonyms

type T   = Type
type TT  = T -> T
type TTT = T -> TT
type C   = Constraint
type TC  = T -> C