1MAP-SS-DataTypes {
2   itu-t identified-organization (4) etsi (0) mobileDomain (0)
3   gsm-Network (1) modules (3) map-SS-DataTypes (14) version9 (9)}
4
5DEFINITIONS
6
7IMPLICIT TAGS
8
9::=
10
11BEGIN
12
13EXPORTS
14	RegisterSS-Arg,
15	SS-Info,
16	SS-Status,
17	SS-SubscriptionOption,
18	SS-ForBS-Code,
19	InterrogateSS-Res,
20	USSD-Arg,
21	USSD-Res,
22	USSD-DataCodingScheme,
23	USSD-String,
24	Password,
25	GuidanceInfo,
26	SS-List,
27	SS-InfoList,
28	OverrideCategory,
29	CliRestrictionOption,
30	NoReplyConditionTime,
31	ForwardingOptions,
32	maxNumOfSS,
33	SS-Data,
34	SS-InvocationNotificationArg,
35	SS-InvocationNotificationRes,
36	CCBS-Feature,
37	RegisterCC-EntryArg,
38	RegisterCC-EntryRes,
39	EraseCC-EntryArg,
40	EraseCC-EntryRes
41;
42
43IMPORTS
44	AddressString,
45	ISDN-AddressString,
46	ISDN-SubaddressString,
47	FTN-AddressString,
48	IMSI,
49	BasicServiceCode,
50	AlertingPattern,
51	EMLPP-Priority,
52	MaxMC-Bearers,
53	MC-Bearers,
54	ExternalSignalInfo
55FROM MAP-CommonDataTypes {
56   itu-t identified-organization (4) etsi (0) mobileDomain (0)
57   gsm-Network (1) modules (3) map-CommonDataTypes (18) version9 (9)}
58
59	ExtensionContainer
60FROM MAP-ExtensionDataTypes {
61   itu-t identified-organization (4) etsi (0) mobileDomain (0)
62   gsm-Network (1) modules (3) map-ExtensionDataTypes (21) version9 (9)}
63
64	SS-Code
65FROM MAP-SS-Code {
66   itu-t identified-organization (4) etsi (0) mobileDomain (0)
67   gsm-Network (1) modules (3) map-SS-Code (15) version9 (9)}
68;
69
70
71RegisterSS-Arg ::= SEQUENCE {
72	ss-Code		SS-Code,
73	basicService	BasicServiceCode	OPTIONAL,
74	forwardedToNumber	[4] AddressString	OPTIONAL,
75	forwardedToSubaddress	[6] ISDN-SubaddressString	OPTIONAL,
76	noReplyConditionTime	[5] NoReplyConditionTime	OPTIONAL,
77	...,
78	defaultPriority	[7] EMLPP-Priority	OPTIONAL,
79	nbrUser		[8] MC-Bearers	OPTIONAL,
80	longFTN-Supported	[9]	NULL		OPTIONAL }
81
82NoReplyConditionTime ::= INTEGER (5..30)
83
84SS-Info ::= CHOICE {
85	forwardingInfo	[0] ForwardingInfo,
86	callBarringInfo	[1] CallBarringInfo,
87	ss-Data		[3] SS-Data}
88
89ForwardingInfo ::= SEQUENCE {
90	ss-Code		SS-Code		OPTIONAL,
91	forwardingFeatureList	ForwardingFeatureList,
92	...}
93
94ForwardingFeatureList ::=
95	SEQUENCE SIZE (1..maxNumOfBasicServiceGroups) OF
96				ForwardingFeature
97
98ForwardingFeature ::= SEQUENCE {
99	basicService	BasicServiceCode	OPTIONAL,
100	ss-Status		[4] SS-Status	OPTIONAL,
101	forwardedToNumber	[5] ISDN-AddressString	OPTIONAL,
102	forwardedToSubaddress	[8] ISDN-SubaddressString	OPTIONAL,
103	forwardingOptions	[6] ForwardingOptions	OPTIONAL,
104	noReplyConditionTime	[7] NoReplyConditionTime	OPTIONAL,
105	...,
106	longForwardedToNumber	[9] FTN-AddressString	OPTIONAL }
107
108SS-Status ::= OCTET STRING (SIZE (1))
109
110	-- bits 8765: 0000 (unused)
111	-- bits 4321: Used to convey the "P bit","R bit","A bit" and "Q bit",
112	--		    representing supplementary service state information
113	--		    as defined in TS 3GPP TS 23.011 [22]
114
115	-- bit 4: "Q bit"
116
117	-- bit 3: "P bit"
118
119	-- bit 2: "R bit"
120
121	-- bit 1: "A bit"
122
123ForwardingOptions ::= OCTET STRING (SIZE (1))
124
125	-- bit 8: notification to forwarding party
126	--	0  no notification
127	--	1  notification
128
129	-- bit 7: redirecting presentation
130	--	0 no presentation
131	--	1  presentation
132
133	-- bit 6: notification to calling party
134	--	0  no notification
135	--	1  notification
136
137	-- bit 5: 0 (unused)
138
139	-- bits 43: forwarding reason
140	--	00  ms not reachable
141	--	01  ms busy
142	--	10  no reply
143	--	11  unconditional when used in a SRI Result,
144	--	    or call deflection when used in a RCH Argument
145	-- bits 21: 00 (unused)
146
147CallBarringInfo ::= SEQUENCE {
148	ss-Code		SS-Code		OPTIONAL,
149	callBarringFeatureList	CallBarringFeatureList,
150	...}
151
152CallBarringFeatureList ::= SEQUENCE SIZE (1..maxNumOfBasicServiceGroups) OF
153				CallBarringFeature
154
155CallBarringFeature ::= SEQUENCE {
156	basicService	BasicServiceCode	OPTIONAL,
157	ss-Status	[4] SS-Status	OPTIONAL,
158	...}
159
160SS-Data ::= SEQUENCE {
161	ss-Code		SS-Code		OPTIONAL,
162	ss-Status		[4] SS-Status	OPTIONAL,
163	ss-SubscriptionOption	SS-SubscriptionOption	OPTIONAL,
164	basicServiceGroupList	BasicServiceGroupList	OPTIONAL,
165	...,
166	defaultPriority	EMLPP-Priority	OPTIONAL,
167	nbrUser		[5] MC-Bearers	OPTIONAL
168	}
169
170SS-SubscriptionOption ::= CHOICE {
171	cliRestrictionOption	[2] CliRestrictionOption,
172	overrideCategory	[1] OverrideCategory}
173
174CliRestrictionOption ::= ENUMERATED {
175	permanent  (0),
176	temporaryDefaultRestricted  (1),
177	temporaryDefaultAllowed  (2)}
178
179OverrideCategory ::= ENUMERATED {
180	overrideEnabled  (0),
181	overrideDisabled  (1)}
182
183SS-ForBS-Code ::= SEQUENCE {
184	ss-Code		SS-Code,
185	basicService	BasicServiceCode	OPTIONAL,
186	...,
187	longFTN-Supported	[4]	NULL		OPTIONAL }
188
189GenericServiceInfo ::= SEQUENCE {
190	ss-Status	SS-Status,
191	cliRestrictionOption	CliRestrictionOption	OPTIONAL,
192	...,
193	maximumEntitledPriority	[0] EMLPP-Priority	OPTIONAL,
194	defaultPriority	[1] EMLPP-Priority	OPTIONAL,
195	ccbs-FeatureList	[2] CCBS-FeatureList	OPTIONAL,
196	nbrSB		[3] MaxMC-Bearers	OPTIONAL,
197	nbrUser		[4] MC-Bearers	OPTIONAL,
198	nbrSN		[5] MC-Bearers	OPTIONAL }
199
200CCBS-FeatureList ::= SEQUENCE SIZE (1..maxNumOfCCBS-Requests) OF
201				CCBS-Feature
202
203maxNumOfCCBS-Requests  INTEGER ::= 5
204
205CCBS-Feature ::= SEQUENCE {
206	ccbs-Index	[0] CCBS-Index	OPTIONAL,
207	b-subscriberNumber	[1] ISDN-AddressString	OPTIONAL,
208	b-subscriberSubaddress	[2] ISDN-SubaddressString	OPTIONAL,
209	basicServiceGroup	[3] BasicServiceCode	OPTIONAL,
210	...}
211
212CCBS-Index  ::= INTEGER (1..maxNumOfCCBS-Requests)
213
214InterrogateSS-Res ::= CHOICE {
215	ss-Status		[0] SS-Status,
216	basicServiceGroupList	[2] BasicServiceGroupList,
217	forwardingFeatureList	[3] ForwardingFeatureList,
218	genericServiceInfo	[4]	GenericServiceInfo }
219
220USSD-Arg ::= SEQUENCE {
221	ussd-DataCodingScheme	USSD-DataCodingScheme,
222	ussd-String	USSD-String,
223	... ,
224	alertingPattern	AlertingPattern	OPTIONAL,
225	msisdn		[0] ISDN-AddressString	OPTIONAL }
226
227USSD-Res ::= SEQUENCE {
228	ussd-DataCodingScheme	USSD-DataCodingScheme,
229	ussd-String	USSD-String,
230	...}
231
232USSD-DataCodingScheme ::= OCTET STRING (SIZE (1))
233	-- The structure of the USSD-DataCodingScheme is defined by
234	-- the Cell Broadcast Data Coding Scheme as described in
235	-- TS 3GPP TS 23.038 [25]
236
237USSD-String ::= OCTET STRING (SIZE (1..maxUSSD-StringLength))
238	-- The structure of the contents of the USSD-String is dependent
239	-- on the USSD-DataCodingScheme as described in TS 3GPP TS 23.038 [25].
240
241maxUSSD-StringLength  INTEGER ::= 160
242
243Password ::= NumericString
244	(FROM ("0"|"1"|"2"|"3"|"4"|"5"|"6"|"7"|"8"|"9"))
245	(SIZE (4))
246
247GuidanceInfo ::= ENUMERATED {
248	enterPW  (0),
249	enterNewPW  (1),
250	enterNewPW-Again  (2)}
251	-- How this information is really delivered to the subscriber
252	-- (display, announcement, ...) is not part of this
253	-- specification.
254
255SS-List ::= SEQUENCE SIZE (1..maxNumOfSS) OF
256				SS-Code
257
258maxNumOfSS  INTEGER ::= 30
259
260SS-InfoList ::= SEQUENCE SIZE (1..maxNumOfSS) OF
261				SS-Info
262
263BasicServiceGroupList ::= SEQUENCE SIZE (1..maxNumOfBasicServiceGroups) OF
264				BasicServiceCode
265
266maxNumOfBasicServiceGroups  INTEGER ::= 13
267
268SS-InvocationNotificationArg ::= SEQUENCE {
269	imsi			[0] IMSI,
270	msisdn		[1] ISDN-AddressString,
271	ss-Event		[2] SS-Code,
272	-- The following SS-Code values are allowed :
273	-- ect		SS-Code ::= '00110001'B
274	-- multiPTY	SS-Code ::= '01010001'B
275	-- cd		SS-Code ::= '00100100'B
276	-- ccbs		SS-Code ::= '01000100'B
277	ss-EventSpecification	[3] SS-EventSpecification	OPTIONAL,
278	extensionContainer	[4] ExtensionContainer	OPTIONAL,
279	...,
280	b-subscriberNumber	[5]	ISDN-AddressString	OPTIONAL,
281	ccbs-RequestState	[6]	CCBS-RequestState	OPTIONAL
282	}
283
284CCBS-RequestState ::= ENUMERATED {
285	request  	(0),
286	recall  	(1),
287	active  	(2),
288	completed	(3),
289	suspended	(4),
290	frozen	(5),
291	deleted	(6)
292	}
293
294SS-InvocationNotificationRes ::= SEQUENCE {
295	extensionContainer	ExtensionContainer	OPTIONAL,
296	...
297	}
298
299SS-EventSpecification ::= SEQUENCE SIZE (1..maxEventSpecification) OF
300				AddressString
301
302maxEventSpecification  INTEGER ::= 2
303
304RegisterCC-EntryArg ::= SEQUENCE {
305	ss-Code		[0]	SS-Code,
306	ccbs-Data		[1]	CCBS-Data	OPTIONAL,
307	...}
308
309CCBS-Data ::= SEQUENCE {
310	ccbs-Feature	[0]	CCBS-Feature,
311	translatedB-Number	[1]	ISDN-AddressString,
312	serviceIndicator	[2]	ServiceIndicator	OPTIONAL,
313	callInfo		[3]	ExternalSignalInfo,
314	networkSignalInfo	[4]	ExternalSignalInfo,
315	...}
316
317ServiceIndicator ::= BIT STRING {
318	clir-invoked (0),
319	camel-invoked (1)} (SIZE(2..32))
320	-- exception handling:
321	-- bits 2 to 31 shall be ignored if received and not understood
322
323RegisterCC-EntryRes ::= SEQUENCE {
324	ccbs-Feature	[0] CCBS-Feature	OPTIONAL,
325	...}
326
327EraseCC-EntryArg ::= SEQUENCE {
328	ss-Code		[0]	SS-Code,
329	ccbs-Index	[1]	CCBS-Index	OPTIONAL,
330	...}
331
332EraseCC-EntryRes ::= SEQUENCE {
333	ss-Code		[0]	SS-Code,
334	ss-Status		[1] SS-Status	OPTIONAL,
335	...}
336
337END
338