diff --git a/exercises/practice/atbash-cipher/atbash_cipher_tests.plt b/exercises/practice/atbash-cipher/atbash_cipher_tests.plt index 34cb2629..60ae1664 100644 --- a/exercises/practice/atbash-cipher/atbash_cipher_tests.plt +++ b/exercises/practice/atbash-cipher/atbash_cipher_tests.plt @@ -35,7 +35,7 @@ pending :- Ciphertext == "gifgs rhurx grlm". test(encode_all_the_letters, condition(pending)) :- - encode("The quick brown fox jumps over the lazy dog." Ciphertext), + encode("The quick brown fox jumps over the lazy dog.", Ciphertext), Ciphertext == "gsvjf rxpyi ldmul cqfnk hlevi gsvoz abwlt". test(decode_exercism, condition(pending)) :- diff --git a/exercises/practice/saddle-points/.meta/saddle_points.example.pl b/exercises/practice/saddle-points/.meta/saddle_points.example.pl index 5427063c..22471561 100644 --- a/exercises/practice/saddle-points/.meta/saddle_points.example.pl +++ b/exercises/practice/saddle-points/.meta/saddle_points.example.pl @@ -1,10 +1,10 @@ :- use_module(library(clpfd)). -saddle_point(Matrix, RowMaxes, ColMins, X, Y) :- - nth1(Y, Matrix, Row), - nth1(X, Row, Cell), - nth1(Y, RowMaxes, RowMax), - nth1(X, ColMins, ColMin), +saddle_point(Matrix, RowMaxes, ColMins, R, C) :- + nth1(R, Matrix, Row), + nth1(C, Row, Cell), + nth1(R, RowMaxes, RowMax), + nth1(C, ColMins, ColMin), Cell #>= RowMax, Cell #=< ColMin. saddle_points(Matrix, SaddlePoints) :- @@ -13,4 +13,4 @@ maplist(min_list, Transposed, ColMins), length(RowMaxes, Rows), length(ColMins, Cols), - findall((X, Y), (between(1, Rows, Y), between(1, Cols, X), saddle_point(Matrix, RowMaxes, ColMins, X, Y)), SaddlePoints). + findall((X, Y), (between(1, Rows, X), between(1, Cols, Y), saddle_point(Matrix, RowMaxes, ColMins, X, Y)), SaddlePoints). diff --git a/exercises/practice/word-count/word_count_tests.plt b/exercises/practice/word-count/word_count_tests.plt index 22cfe87b..f359dee6 100644 --- a/exercises/practice/word-count/word_count_tests.plt +++ b/exercises/practice/word-count/word_count_tests.plt @@ -66,7 +66,7 @@ pending :- "don't"-2, "first"-1, "getting"-1, - "it"-1 + "it"-1, "laugh"-1, "then"-1, "you're"-1