Launchy | right-aligned |
RapidEE | http://www.rapidee.com/en/about |
WinDirStat | https://windirstat.info/ |
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 Sums where | |
import Data.Array ((:), foldM, nub, sort) | |
import Data.Maybe (Maybe(..)) | |
import Prelude (($), (+), (++), map) | |
-- Given an array of integers, compute the list of all | |
-- possible totals, using each integer at most once. | |
sums :: Array Int -> Maybe (Array Int) |
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 FilterM where | |
import Prelude (Monad, ($), (<), (>), (/=), bind, return) | |
import Data.List (List(..)) | |
import Data.Maybe (Maybe(..)) | |
filterM' :: forall m a. (Monad m) => (a -> m Boolean) -> List a -> List a -> m (List a) | |
filterM' p acc Nil = return acc | |
filterM' p acc (Cons x xs) = do |
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 Example.HelloGlsl where | |
import Prelude (Unit(..) | |
,($) | |
,bind) | |
import Control.Monad.Eff (Eff(..)) | |
import Control.Monad.Eff.Alert (Alert(..) | |
,alert) | |
import Control.Monad.Eff.Console (CONSOLE(..) |
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 Plot where | |
import Prelude (($), bind, return) | |
import Control.Monad.Eff (Eff(..)) | |
import Data.List (List(..), toList) | |
import Data.Maybe (Maybe(..)) | |
import Graphics.Canvas ( Canvas(..) | |
, Context2D(..) | |
, closePath |
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
class Vehicle { | |
var color: String? | |
var maxSpeed = 80 { | |
willSet(s) { | |
print("Changing max speed from \(s)...") | |
} | |
didSet(s) { | |
print("to \(s)") | |
} | |
} |
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
import Foundation | |
class Vehicle { | |
lazy var isWarmedUp: Bool = self.start() | |
var color: String? | |
var maxSpeed = 80 { | |
willSet(s) { | |
print("Changing max speed from \(s)...") | |
} | |
didSet(s) { |
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
#version 3.7; | |
global_settings { assumed_gamma 1.0 } | |
#include "colors.inc" | |
#include "glass.inc" | |
#include "textures.inc" | |
// Random color generator with moving seed | |
#declare My_seed = seed(now * 100000); |
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
(defn solution [big-string] | |
(->> big-string | |
(clojure.string/split-lines) ; Break string into individual numbers | |
(map reverse) ; Reverse the digits in each | |
(map (fn [n] (map #(Integer/parseInt (str %)) n))) ; Turn all characters into actual ints | |
(apply map +) ; Sum each column of digits | |
(reduce (fn [[digits carry] n] ; Fold over the partial sums, | |
[(conj digits (rem (+ n carry) 10)) ; adding the current sum modulo ten to the list of digits | |
(quot (+ n carry) 10)]) [() 0]) ; and taking the quotient over ten as the carry | |
((fn [[digits carry]] (str carry (apply str digits)))) ; Convert back to a single string, last carry at the front. |
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
(ns ellipses | |
(:require [quil.core :as q :include-macros true] | |
[quil.middleware :as m])) | |
(defn setup [] | |
(q/background 0) | |
(q/stroke-weight 0.25) | |
(q/no-fill) | |
(q/color-mode :hsb) | |
(q/no-loop)) |