This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
module IRDTT where | |
open import Level | |
open import Data.Product public using ( Σ ; _,_ ; proj₁ ; proj₂ ) | |
open import Data.Sum public using ( _⊎_ ; inj₁ ; inj₂ ) | |
record ⊤ {a} : Set a where | |
constructor tt | |
data Type {a} : Set (suc a) | |
⟦_⟧ : ∀{a} → Type {a} → Set a |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
(set-fontset-font t '(#x2080 . #x00208e) "Monoco") | |
(set-fontset-font t '(#x002070 . #x00207e) "Monoco") |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
(defvar slide-delimiter | |
"----------------------------------------------------------------------" | |
"Delimiter used for changing slides") | |
(defun narrow-to-slide () | |
(interactive) | |
(search-forward slide-delimiter) | |
(next-line) | |
(let ((start (point))) | |
(search-forward slide-delimiter) |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
module Maths where | |
data Nat : Set where | |
zero : Nat | |
suc : Nat → Nat | |
plus : Nat → Nat → Nat | |
plus zero n = n | |
plus (suc m) n = suc (plus m n) |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
tex = ARGV[0] | |
modified_at = File.mtime tex | |
puts "Starting from: #{modified_at}" | |
loop do | |
if modified_at != (mtime = File.mtime tex) | |
modified_at = mtime | |
`pdflatex #{tex}` | |
puts "Recompiled for: #{modified_at}" | |
end |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
\usepackage[mathletters]{ucs} | |
\usepackage[utf8]{inputenc} |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
Mathematical Logic - Kleene | |
Basic Category Theory for Computer Scientists - Pierce | |
A Book of Abstract Algebra - Pinter | |
Conceptual Mathematics - Lawvere & Schanuel | |
An Introduction to Formal Logic - Smith | |
To Mock A Mockingbird - Smullyan | |
Introduction To Logic - Tarski | |
Purely Functional Data Structures - Okasaki | |
Topoi: The Categorial Analysis of Logic - Goldblatt | |
Lectures on the Curry-Howard Isomorphism - Sorensen, Urzyczyn |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
module Decimal where | |
open import Data.Nat | |
infixr 5 _∷_ | |
infixl 8 _^_ | |
_^_ : ℕ → ℕ → ℕ | |
n ^ zero = 1 | |
n ^ (suc m) = n * (n ^ m) |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
% $Id: Solve.oz,v 1.1 2007/11/26 20:13:05 leavens Exp leavens $ | |
%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% | |
% Mozart System Supplements | |
% This file gives the extensions to the basic Mozart system that | |
% are used in the book "Concepts, Techniques, and Models of Computer | |
% Programming". The contents of this file can be put in the .ozrc | |
% file in your home directory, which will cause it to be loaded | |
% automatically when Mozart starts up. |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
larrytheliquid@netbooktheliquid:~/src/testhubris$ Hubrify foo2.hs --module Bar --output foo2.bundle | |
Candidates: ["l"] | |
Language.Ruby.Hubris.wrap Bar.l (fromIntegral $ fromEnum $ Language.Ruby.Hubris.Binding.RUBY_Qtrue) | |
type of wrap.l is "Language.Ruby.Hubris.Binding.Value" | |
Exportable: ["l"] | |
{-# LANGUAGE ForeignFunctionInterface, ScopedTypeVariables #-} | |
module Language.Ruby.Hubris.Exports.Bar where | |
import Language.Ruby.Hubris | |
import qualified Prelude as P() | |
import Language.Ruby.Hubris.Binding |