-
-
Notifications
You must be signed in to change notification settings - Fork 51
Commit
This commit does not belong to any branch on this repository, and may belong to a fork outside of the repository.
Merge pull request #306 from marionebl/add-implementation-stubs
- Loading branch information
Showing
48 changed files
with
335 additions
and
1 deletion.
There are no files selected for viewing
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1 @@ | ||
let acronym _ = failwith "'acronym' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,4 @@ | ||
type base = int | ||
|
||
let convert_bases ~from ~digits ~target = | ||
failwith "'convert_bases' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,14 @@ | ||
type allergen = Eggs | ||
| Peanuts | ||
| Shellfish | ||
| Strawberries | ||
| Tomatoes | ||
| Chocolate | ||
| Pollen | ||
| Cats | ||
|
||
let allergic_to _ _ = | ||
failwith "'allergic_to' is missing" | ||
|
||
let allergies _ = | ||
failwith "'allergies' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let anagrams _ _ = | ||
failwith "'anagrams' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
|
@@ -6,3 +6,7 @@ | |
(name runtest) | ||
(deps (:x test.exe)) | ||
(action (run %{x}))) | ||
|
||
(env | ||
(dev | ||
(flags (:standard -warn-error -A)))) |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,5 @@ | ||
let encode ?block_size _ = | ||
failwith "'encode' is missing" | ||
|
||
let decode _ = | ||
failwith "'decode' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
|
@@ -6,3 +6,7 @@ | |
(name runtest) | ||
(deps (:x test.exe)) | ||
(action (run %{x}))) | ||
|
||
(env | ||
(dev | ||
(flags (:standard -warn-error -A)))) |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,5 @@ | ||
let verse _ = | ||
failwith "'verse' is missing" | ||
|
||
let lyrics ~from ~until = | ||
failwith "'lyrics' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let find _ _ = | ||
failwith "'find' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let response_for _ = | ||
failwith "'response_for' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,10 @@ | ||
type t | ||
|
||
let new_game = | ||
failwith "'new_game' is missing" | ||
|
||
let roll _ _ = | ||
failwith "'roll' is missing" | ||
|
||
let score _ = | ||
failwith "'score' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let make_change ~target ~coins = | ||
failwith "'make_change' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
|
@@ -6,3 +6,7 @@ | |
(name runtest) | ||
(deps (:x test.exe)) | ||
(action (run %{x}))) | ||
|
||
(env | ||
(dev | ||
(flags (:standard -warn-error -A)))) |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,4 @@ | ||
type player = O | X | ||
|
||
let connect _ = | ||
failwith "'connect' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,51 @@ | ||
module type ELEMENT = sig | ||
type t | ||
val compare : t -> t -> int | ||
end | ||
|
||
module Make(El: ELEMENT) = struct | ||
type t = El.t list | ||
type el = El.t | ||
|
||
let el_equal _ _ = | ||
failwith "'el_equal' is missing" | ||
|
||
let is_empty _ = | ||
failwith "'is_empty' is missing" | ||
|
||
let is_member _ _ = | ||
failwith "'is_member' is missing" | ||
|
||
let is_subset _ _ = | ||
failwith "'is_subset' is missing" | ||
|
||
let is_disjoint _ _ = | ||
failwith "'is_disjoint' is missing" | ||
|
||
let equal _ _ = | ||
failwith "'equal' is missing" | ||
|
||
let of_list _ = | ||
failwith "'of_list' is missing" | ||
|
||
let add _ _ = | ||
failwith "'add' is missing" | ||
|
||
type status = [ | ||
| `OnlyA | ||
| `OnlyB | ||
| `Both | ||
] | ||
|
||
let diff_filter _ _ _ = | ||
failwith "'diff_filter' is missing" | ||
|
||
let difference _ _ = | ||
failwith "'difference' is missing" | ||
|
||
let intersect _ _ = | ||
failwith "'intersect' is missing" | ||
|
||
let union _ _ = | ||
failwith "'union' is missing" | ||
end |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,8 @@ | ||
let square_of_sum _ = | ||
failwith "'square_of_sum' is missing" | ||
|
||
let sum_of_squares _ = | ||
failwith "'sum_of_squares' is missing" | ||
|
||
let difference_of_squares _ = | ||
failwith "'difference_of_squares' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,4 @@ | ||
type dominoe = (int * int) | ||
|
||
let chain _ = | ||
failwith "'chain' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let transform _ = | ||
failwith "'transform' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let evaluate _ = | ||
failwith "'evaluate' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,15 @@ | ||
open Base | ||
|
||
module Int_map = Map.M(Int) | ||
type school = string list Int_map.t | ||
|
||
let empty_school = Map.empty (module Int) | ||
|
||
let add _ _ _ = | ||
failwith "'add' is missing" | ||
|
||
let grade _ _ = | ||
failwith "'grade' is missing" | ||
|
||
let sorted _ = | ||
failwith "'sorted' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,4 @@ | ||
type nucleotide = A | C | G | T | ||
|
||
let hamming_distance _ _ = | ||
failwith "'hamming_distance' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,18 @@ | ||
type t | ||
|
||
type progress = | ||
| Win | ||
| Lose | ||
| Busy of int | ||
|
||
let create _ = | ||
failwith "'create' is missing" | ||
|
||
let feed _ _ = | ||
failwith "'feed' is missing" | ||
|
||
let masked_word _ = | ||
failwith "'masked_word' is missing" | ||
|
||
let progress _ = | ||
failwith "'progress' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let to_int _ = | ||
failwith "'to_int' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let leap_year _ = | ||
failwith "'leap_year' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
|
@@ -6,3 +6,7 @@ | |
(name runtest) | ||
(deps (:x test.exe)) | ||
(action (run %{x}))) | ||
|
||
(env | ||
(dev | ||
(flags (:standard -warn-error -A)))) |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,20 @@ | ||
let length _ = | ||
failwith "'length' is missing" | ||
|
||
let reverse _ = | ||
failwith "'reverse' is missing" | ||
|
||
let map ~f _ = | ||
failwith "'map' is missing" | ||
|
||
let filter ~f _ = | ||
failwith "'filter' is missing" | ||
|
||
let fold ~init ~f _ = | ||
failwith "'fold' is missing" | ||
|
||
let append _ _ = | ||
failwith "'append' is missing" | ||
|
||
let concat _ = | ||
failwith "'concat' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let valid _ = | ||
failwith "'valid' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let are_balanced _ = | ||
failwith "'are_balanced' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
|
@@ -6,3 +6,7 @@ | |
(name runtest) | ||
(deps (:x test.exe)) | ||
(action (run %{x}))) | ||
|
||
(env | ||
(dev | ||
(flags (:standard -warn-error -A)))) |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let annotate _ = | ||
failwith "'annotate' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
|
@@ -13,4 +13,4 @@ | |
|
||
(env | ||
(dev | ||
(flags (:standard -warn-error -A)))) | ||
(flags (:standard -warn-error -A)))) |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,16 @@ | ||
type palindrome_products = { | ||
value : int option; | ||
factors : (int * int) list; | ||
} | ||
|
||
let smallest ~min ~max = | ||
failwith "'smallest' is missing" | ||
|
||
let largest ~min ~max = | ||
failwith "'largest' is missing" | ||
|
||
let show_palindrome_products _ = | ||
failwith "'show_palindrome_products' is missing" | ||
|
||
let equal_palindrome_products _ _ = | ||
failwith "'equal_palindrome_products' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let is_pangram _ = | ||
failwith "'is_pangram' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let number _ = | ||
failwith "'number' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let factors_of _ = | ||
failwith "'factors_of' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let raindrop _ = | ||
failwith "'raindrop' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
|
@@ -6,3 +6,7 @@ | |
(name runtest) | ||
(deps (:x test.exe)) | ||
(action (run %{x}))) | ||
|
||
(env | ||
(dev | ||
(flags (:standard -warn-error -A)))) |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,23 @@ | ||
type 'a cell | ||
type callback_id | ||
|
||
let create_input_cell ~value ~eq = | ||
failwith "'create_input_cell' is missing" | ||
|
||
let value_of _ = | ||
failwith "'value_of' is missing" | ||
|
||
let set_value _ = | ||
failwith "'set_value' is missing" | ||
|
||
let create_compute_cell_1 _ ~f ~eq = | ||
failwith "'create_compute_cell_1' is missing" | ||
|
||
let create_compute_cell_2 _ _ ~f ~eq = | ||
failwith "'create_compute_cell_2' is missing" | ||
|
||
let add_callback _ ~k = | ||
failwith "'add_callback' is missing" | ||
|
||
let remove_callback _ _ = | ||
failwith "'remove_callback' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let count_rectangles _ = | ||
failwith "'count_rectangles' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,5 @@ | ||
type dna = [ `A | `C | `G | `T ] | ||
type rna = [ `A | `C | `G | `U ] | ||
|
||
let to_rna _ = | ||
failwith "'to_rna' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,10 @@ | ||
type robot | ||
|
||
let new_robot = | ||
failwith "'new_robot' is missing" | ||
|
||
let name = | ||
failwith "'name' is missing" | ||
|
||
let reset = | ||
failwith "'reset' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let to_roman _ = | ||
failwith "'to_roman' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,5 @@ | ||
let encode _ = | ||
failwith "'encode' is missing" | ||
|
||
let decode _ = | ||
failwith "'decode' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let in_english _ = | ||
failwith "'in_english' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,5 @@ | ||
type planet = Mercury | Venus | Earth | Mars | ||
| Jupiter | Saturn | Neptune | Uranus | ||
|
||
let age_on _ _ = | ||
failwith "'age_on' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,8 @@ | ||
let is_equilateral _ _ _ = | ||
failwith "'is_equilateral' is missing" | ||
|
||
let is_isosceles _ _ _ = | ||
failwith "'is_isosceles' is missing" | ||
|
||
let is_scalene _ _ _ = | ||
failwith "'is_scalene' is missing" |
This file contains 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
Original file line number | Diff line number | Diff line change |
---|---|---|
@@ -0,0 +1,2 @@ | ||
let word_count _ = | ||
failwith "'word_count' is missing" |
Oops, something went wrong.