转换为DCG nemicontext不起作用 - 关注



作为此问题的后续问题

列表中项目的返回计数,但是如果两个相同的项目彼此相邻,则不要增加计数。

此代码是我最接近使用DCG和Semicontext解决此问题的最接近的代码。

lookahead(C),[C] -->
    [C].
% empty list
% No lookahead needed because last item in list.
count_dcg(N,N) --> [].
% single item in list
% No lookahead  needed because only one in list.
count_dcg(N0,N) -->
    [_],
    + [_],
    { N is N0 + 1 }.
% Lookahead needed because two items in list and
% only want to remove first item.
count_dcg(N0,N) -->
    [C1],
    lookahead(C2),
    { C1 == C2 },
    count_dcg(N0,N).
% Lookahead needed because two items in list and
% only want to remove first item.
count_dcg(N0,N) -->
    [C1],
    lookahead(C2),
    {
        C1 == C2,
        N1 is N0 + 1
    },
    count_dcg(N1,N).
count(L,N) :-
    DCG = count_dcg(0,N),
    phrase(DCG,L).

使用dcg在子句头上使用semicontext解决问题的正确方法是什么?

想知道子句头上的分号的变化是否可能。如果可能的话,则需要工作示例代码,如果不可能,则需要解释。

我认为这是正确使用半上下文符号。我正在使用0,s(0),...

计数
% Constraint Logic Programming
:- use_module(library(dif)).    % Sound inequality
:- use_module(library(clpfd)).  % Finite domain constraints
list([])     --> [].
list([L|Ls]) --> [L], list(Ls).
state(S), [state(S)] --> [state(S)].
state(S, s(S)), [state(s(S))] --> [state(S)].
keep_state(S,I),[state(S)] --> [state(S)],[I].
end_state(S)  -->[state(S)],[].
lookahead(C),[S,C] -->
    [S,C].
count_dcg(S,S) --> 
    state(S), %might not need this
    end_state(S).
/* Can be used get the length of a list
count_dcg(S,S2) --> 
    state(S,S1),
    keep_state(S1,_),
    count_dcg(S1,S2),
    {}.
*/
%last item.
count_dcg(S,S1) -->     
    state(S,S1),
    keep_state(S1,_C),
    list(R),
    {R = [state(_)]}.
%Two the same dont increase state 
count_dcg(S,S1) -->
    state(S), %might not need this
    keep_state(S,C1),
    lookahead(C1),
    count_dcg(S,S1).
%Two different increase state  
count_dcg(S,S2)  -->
    state(S,S1),
    keep_state(S1,C1),
    lookahead(C2),
    {
        dif(C1,C2)
    },
    count_dcg(S1,S2).
count(L,S) :-
    phrase(count_dcg(0,S),[state(0)|L]).

这不如我希望:

这样的案例所希望
65 ?- count([a,b,X,c],L).
X = b,
L = s(s(s(0))) ;
;
X = c,
L = s(s(s(0))) .

您可以使用:

转换Peano
natsx_int(0, 0). 
natsx_int(s(N), I1) :- 
  I1 #> 0, 
  I2 #= I1 - 1, 
  natsx_int(N, I2).

,也可以更改状态谓词:

state(S), [state(S)] --> [state(S)].
state(S, S2), [state(S2)] --> [state(S)],{S2#=S+1}.

怎么样:

:-use_module(library(clpfd)).
list([])     --> [].
list([L|Ls]) --> [L], list(Ls).
lookahead(C),[C] -->
    [C].
count_dcg(N,N) --> [].
count_dcg(N0,N) --> %last item.
    [_],
    list(R),
    {R = [], N #=N0+1}.
count_dcg(N0,N) -->
    [C1],
    lookahead(C1),
    count_dcg(N0,N).
count_dcg(N0,N) -->
    [C1],
    lookahead(C2),
    {
        dif(C1,C2),
        N1 #= N0 + 1
    },
    count_dcg(N1,N).
count(L,N) :-
    phrase(count_dcg(0,N),L).

最新更新