cosmetic: Fix trailing whitespace

Change-Id: I9c894440818040151015283b0df7e1646110f5d5
This commit is contained in:
Pau Espin 2024-01-22 14:38:31 +01:00
parent ee15ee2b44
commit 9487d9276a
2 changed files with 6 additions and 6 deletions

View File

@ -2,7 +2,7 @@
% License, v. 2.0. If a copy of the MPL was not distributed with this % License, v. 2.0. If a copy of the MPL was not distributed with this
% file, You can obtain one at https://mozilla.org/MPL/2.0/. % file, You can obtain one at https://mozilla.org/MPL/2.0/.
% (C) 2019 Andrey Velikiy <agreat22@gmail.com> % (C) 2019 Andrey Velikiy <agreat22@gmail.com>
% (C) 2019 Fairwaves (edited) % (C) 2019 Fairwaves (edited)
% (C) 2019 Harald Welte <laforge@gnumonks.org> % (C) 2019 Harald Welte <laforge@gnumonks.org>
-ifndef(GSUP_PROTOCOL). -ifndef(GSUP_PROTOCOL).
@ -85,7 +85,7 @@
pdp_info_complete => true, pdp_info_complete => true,
pdp_info_list => ['GSUPPdpInfo'()], pdp_info_list => ['GSUPPdpInfo'()],
cancellation_type => integer(), cancellation_type => integer(),
freeze_p_tmsi => true, freeze_p_tmsi => true,
msisdn => binary(), msisdn => binary(),
hlr_number => binary(), hlr_number => binary(),
pdp_context_id => [integer()], pdp_context_id => [integer()],

View File

@ -2,7 +2,7 @@
% License, v. 2.0. If a copy of the MPL was not distributed with this % License, v. 2.0. If a copy of the MPL was not distributed with this
% file, You can obtain one at https://mozilla.org/MPL/2.0/. % file, You can obtain one at https://mozilla.org/MPL/2.0/.
% (C) 2019 Andrey Velikiy <agreat22@gmail.com> % (C) 2019 Andrey Velikiy <agreat22@gmail.com>
% (C) 2019 Fairwaves (edited) % (C) 2019 Fairwaves (edited)
-module(gsup_protocol). -module(gsup_protocol).
@ -34,7 +34,7 @@ decode(<<MsgType, Tail/binary>>) ->
true -> GSUPMessage; true -> GSUPMessage;
false -> error({mandatory_ie_missing, MsgTypeAtom, Mandatory -- maps:keys(GSUPMessage)}) false -> error({mandatory_ie_missing, MsgTypeAtom, Mandatory -- maps:keys(GSUPMessage)})
end; end;
_ -> _ ->
error({unknown_gsup_msg_type, MsgType}) error({unknown_gsup_msg_type, MsgType})
end. end.
@ -299,13 +299,13 @@ encode(MsgType, GSUPMessage) when is_integer(MsgType), is_map(GSUPMessage), MsgT
Possible = Mandatory ++ maps:get(optional, Map, []) ++ ?OPTIONAL_DEFAULT, Possible = Mandatory ++ maps:get(optional, Map, []) ++ ?OPTIONAL_DEFAULT,
case {maps:size(maps:with(Mandatory, GSUPMessage)) == length(Mandatory), case {maps:size(maps:with(Mandatory, GSUPMessage)) == length(Mandatory),
maps:size(maps:without(Possible, GSUPMessage)) == 0} of maps:size(maps:without(Possible, GSUPMessage)) == 0} of
{true, true} -> {true, true} ->
Tail = encode_ie(GSUPMessage, <<>>), Tail = encode_ie(GSUPMessage, <<>>),
<<MsgType, Tail/binary>>; <<MsgType, Tail/binary>>;
{false, _} -> error({mandatory_ie_missing, MsgTypeAtom, Mandatory -- maps:keys(GSUPMessage)}); {false, _} -> error({mandatory_ie_missing, MsgTypeAtom, Mandatory -- maps:keys(GSUPMessage)});
{_, false} -> error({ie_not_expected, MsgTypeAtom, maps:keys(GSUPMessage) -- Possible}) {_, false} -> error({ie_not_expected, MsgTypeAtom, maps:keys(GSUPMessage) -- Possible})
end; end;
_ -> _ ->
error({unknown_gsup_msg_type, MsgType}) error({unknown_gsup_msg_type, MsgType})
end. end.