blob: b8ef2424984e0d2fd74cb0a33e9e0f3b92bbca58 [file] [log] [blame]
Harald Welte77804892011-02-06 18:12:47 +01001% Osmocom Erlang utility functions
2
3% (C) 2011 by Harald Welte <laforge@gnumonks.org>
4%
5% All Rights Reserved
6%
7% This program is free software; you can redistribute it and/or modify
8% it under the terms of the GNU Affero General Public License as
9% published by the Free Software Foundation; either version 3 of the
10% License, or (at your option) any later version.
11%
12% This program is distributed in the hope that it will be useful,
13% but WITHOUT ANY WARRANTY; without even the implied warranty of
14% MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
15% GNU General Public License for more details.
16%
17% You should have received a copy of the GNU Affero General Public License
18% along with this program. If not, see <http://www.gnu.org/licenses/>.
Harald Weltef8bf0322012-04-16 13:10:47 +020019%
20% Additional Permission under GNU AGPL version 3 section 7:
21%
22% If you modify this Program, or any covered work, by linking or
23% combining it with runtime libraries of Erlang/OTP as released by
24% Ericsson on http://www.erlang.org (or a modified version of these
25% libraries), containing parts covered by the terms of the Erlang Public
26% License (http://www.erlang.org/EPLICENSE), the licensors of this
27% Program grant you additional permission to convey the resulting work
28% without the need to license the runtime libraries of Erlang/OTP under
29% the GNU Affero General Public License. Corresponding Source for a
30% non-source form of such a combination shall include the source code
31% for the parts of the runtime libraries of Erlang/OTP used as well as
32% that of the covered work.
Harald Welte77804892011-02-06 18:12:47 +010033
34-module(osmo_util).
35-author('Harald Welte <laforge@gnumonks.org>').
36
37-export([digit_list2int/1, int2digit_list/1]).
38-export([reload_config/0]).
Harald Welte8a6823d2011-03-08 16:03:31 +010039-export([tuple_walk/3, tuple_walk_print_cb/3]).
Harald Welte0f2f5962011-04-04 15:59:49 +020040-export([make_prim/4, make_prim/3]).
Harald Welte8ff5df42011-04-04 21:52:52 +020041-export([pointcode2int/1, pointcode2int/2, pointcode_fmt/2]).
Harald Welte79e233f2012-01-31 22:30:22 +010042-export([asn_val/1]).
Harald Welte0f2f5962011-04-04 15:59:49 +020043
44-include("osmo_util.hrl").
45
46-compile({parse_transform, exprecs}).
47-export_records([primitive]).
Harald Welte77804892011-02-06 18:12:47 +010048
49% Convert a list of digits to an integer value
50digit_list2int(Int, []) ->
51 Int;
52digit_list2int(Int, [Digit|Tail]) ->
53 digit_list2int(Int*10 + Digit, Tail).
54digit_list2int(Digits) when is_list(Digits) ->
55 digit_list2int(0, Digits).
56
57% Convert an integer value into a list of decimal digits
58int2digit_list(0, Digits) when is_list(Digits) ->
59 Digits;
60int2digit_list(Int, Digits) when is_integer(Int), is_list(Digits) ->
61 Digit = Int rem 10,
62 int2digit_list(Int div 10, [Digit|Digits]).
63int2digit_list(Int) when is_integer(Int) ->
64 int2digit_list(Int, []).
65
66% reload configuration of an application
67reload_config() ->
68 case init:get_argument(config) of
69 {ok, [ Files ]} ->
70 ConfFiles = [begin
71 S = filename:basename(F,".config"),
72 filename:join(filename:dirname(F),
73 S ++ ".config")
74 end || F <- Files],
75 % Move sys.config to the head of the list
76 Config = lists:sort(fun("sys.config", _) -> true;
77 (_, _) -> false end, ConfFiles),
78
79 OldEnv = application_controller:prep_config_change(),
80
81 Apps = [{application, A, make_appl(A)}
82 || {A,_,_} <- application:which_applications()],
83 application_controller:change_application_data(Apps, Config),
84 application_controller:config_change(OldEnv);
85 _ ->
86 {ok, []}
87 end.
88
89make_appl(App) when is_atom(App) ->
90 AppList = element(2,application:get_all_key(App)),
91 FullName = code:where_is_file(atom_to_list(App) ++ ".app"),
92 case file:consult(FullName) of
93 {ok, [{application, _, Opts}]} ->
94 Env = proplists:get_value(env, Opts, []),
95 lists:keyreplace(env, 1, AppList, {env, Env});
96 {error, _Reason} ->
97 lists:keyreplace(env, 1, AppList, {env, []})
98 end.
Harald Weltecf436012011-03-07 12:54:15 +010099
100
101% Walk a named tuple and (recursively) all its fields, call user-supplied
102% callback for each of them
Harald Welte8a6823d2011-03-08 16:03:31 +0100103tuple_walk(Tpl, TupleCb, Args) when is_tuple(Tpl), is_function(TupleCb),
104 is_list(Args) ->
105 tuple_walk([], Tpl, TupleCb, Args).
Harald Weltecf436012011-03-07 12:54:15 +0100106
Harald Welte8a6823d2011-03-08 16:03:31 +0100107tuple_walk(Path, Tpl, TupleCb, Args) when is_list(Path), is_tuple(Tpl),
108 is_list(Args) ->
Harald Weltecf436012011-03-07 12:54:15 +0100109 % call Callback
Harald Welte8a6823d2011-03-08 16:03:31 +0100110 NewTpl = TupleCb(Path, Tpl, Args),
Harald Weltecf436012011-03-07 12:54:15 +0100111 [TplName|TplList] = tuple_to_list(NewTpl),
Harald Welte8a6823d2011-03-08 16:03:31 +0100112 NewTplList = tuple_fieldlist_walk(Path, TplName, TplList, TupleCb, Args),
Harald Welte4a0afae2011-03-07 23:54:04 +0100113 list_to_tuple([TplName|NewTplList]);
Harald Welte8a6823d2011-03-08 16:03:31 +0100114tuple_walk(Path, TplL, TupleCb, Args) when is_list(Path), is_list(TplL),
115 is_list(Args) ->
116 tuple_walk_list(Path, TplL, TupleCb, Args, []).
Harald Welte4a0afae2011-03-07 23:54:04 +0100117
Harald Welte8a6823d2011-03-08 16:03:31 +0100118tuple_walk_list(_Path, [], _TupleCb, _Args, OutList) ->
Harald Welte4a0afae2011-03-07 23:54:04 +0100119 OutList;
Harald Welte8a6823d2011-03-08 16:03:31 +0100120tuple_walk_list(Path, [Head|Tail], TupleCb, Args, OutList) ->
Harald Welte4a0afae2011-03-07 23:54:04 +0100121 if
122 is_tuple(Head) ->
Harald Welte8a6823d2011-03-08 16:03:31 +0100123 NewHead = tuple_walk(Path, Head, TupleCb, Args);
Harald Welte4a0afae2011-03-07 23:54:04 +0100124 is_list(Head) ->
Harald Welte8a6823d2011-03-08 16:03:31 +0100125 NewHead = tuple_walk(Path, Head, TupleCb, Args);
Harald Welte4a0afae2011-03-07 23:54:04 +0100126 true ->
127 NewHead = Head
128 end,
Harald Welte8a6823d2011-03-08 16:03:31 +0100129 tuple_walk_list(Path, Tail, TupleCb, Args, OutList++[NewHead]).
Harald Welte4a0afae2011-03-07 23:54:04 +0100130
Harald Weltecf436012011-03-07 12:54:15 +0100131
Harald Welte8a6823d2011-03-08 16:03:31 +0100132tuple_fieldlist_walk(Path, TplName, FieldList, TupleCb, Args) ->
133 tuple_fieldlist_walk(Path, TplName, FieldList, TupleCb, Args, []).
Harald Weltecf436012011-03-07 12:54:15 +0100134
Harald Welte8a6823d2011-03-08 16:03:31 +0100135tuple_fieldlist_walk(_Path, _TplName, [], _TplCb, _Args, OutList) ->
Harald Weltecf436012011-03-07 12:54:15 +0100136 OutList;
Harald Welte8a6823d2011-03-08 16:03:31 +0100137tuple_fieldlist_walk(Path, TplName, [Head|List], TupleCb, Args, OutList) ->
Harald Weltecf436012011-03-07 12:54:15 +0100138 if
139 is_tuple(Head) ->
Harald Welte8a6823d2011-03-08 16:03:31 +0100140 NewHead = tuple_walk(Path++[TplName], Head, TupleCb, Args);
Harald Welte4a0afae2011-03-07 23:54:04 +0100141 is_list(Head) ->
Harald Welte8a6823d2011-03-08 16:03:31 +0100142 NewHead = tuple_walk(Path++[TplName], Head, TupleCb, Args);
Harald Weltecf436012011-03-07 12:54:15 +0100143 true ->
144 NewHead = Head
145 end,
Harald Welte8a6823d2011-03-08 16:03:31 +0100146 tuple_fieldlist_walk(Path, TplName, List, TupleCb, Args, OutList++[NewHead]).
Harald Weltecf436012011-03-07 12:54:15 +0100147
148
Harald Welte8a6823d2011-03-08 16:03:31 +0100149tuple_walk_print_cb(Path, Tpl, _Args) when is_list(Path), is_tuple(Tpl) ->
Harald Weltecf436012011-03-07 12:54:15 +0100150 io:format("~p:~p~n", [Path, Tpl]),
151 Tpl.
Harald Welte0f2f5962011-04-04 15:59:49 +0200152
153% helper function to create a #primitive record
154make_prim(Subsys, GenName, SpecName) ->
155 make_prim(Subsys, GenName, SpecName, []).
156make_prim(Subsys, GenName, SpecName, Param) ->
157 #primitive{subsystem = Subsys, gen_name = GenName,
158 spec_name = SpecName, parameters = Param}.
Harald Welte8ff5df42011-04-04 21:52:52 +0200159
160% parse a 3-tuple pointcode into a raw integer
Harald Welte7ad37a22011-12-08 11:50:00 +0100161pointcode2int(Int) when is_integer(Int) ->
162 Int;
Harald Welte0bd35282012-01-23 17:35:57 +0100163pointcode2int(undefined) ->
164 undefined;
Harald Welteba0ada72011-12-08 00:56:30 +0100165pointcode2int(#pointcode{repr=Type, value=Value}) ->
166 pointcode2int(Type, Value);
Harald Welte8ff5df42011-04-04 21:52:52 +0200167pointcode2int({Std, Param}) ->
168 pointcode2int(Std, Param).
169
170pointcode2int(itu, {A, B, C}) ->
171 <<PcInt:14/big>> = <<A:3, B:8, C:3>>,
172 PcInt;
173pointcode2int(ansi, {A, B, C}) ->
174 <<PcInt:24/big>> = <<A:8, B:8, C:8>>,
175 PcInt;
176pointcode2int(ttc, {A, B, C}) ->
177 <<PcInt:16/big>> = <<A:5, B:4, C:7>>,
178 PcInt.
179
180% format a point-code into a 3-tuple according to the standard used
181pointcode_fmt(Std, P) when is_binary(P) ->
182 <<PcInt/integer>> = P,
183 pointcode_fmt(Std, PcInt);
184pointcode_fmt(itu, PcInt) when is_integer(PcInt) ->
185 <<A:3, B:8, C:3>> = <<PcInt:14/big>>,
186 {pointcode, itu, {A, B, C}};
187pointcode_fmt(ansi, PcInt) ->
188 <<A:8, B:8, C:8>> = <<PcInt:24/big>>,
189 {pointcode, ansi, {A, B, C}};
190pointcode_fmt(ttc, PcInt) ->
191 <<A:5, B:4, C:7>> = <<PcInt:16/big>>,
192 {pointcode, ttc, {A, B, C}}.
Harald Welte79e233f2012-01-31 22:30:22 +0100193
194asn_val(undefined) ->
195 asn1_NOVALUE;
196asn_val([]) ->
197 asn1_NOVALUE;
198asn_val(Foo) ->
199 Foo.