Ordinal elements of an array in excel | Excel VBA Lesson - 31 | Excel VBA Array for beginners

preview_player
Показать описание
Ordinal elements of an array in excel | Excel VBA Lesson - 31 | Excel VBA Array for beginners. fundamental of arrays discussion.
#excelvba #excelvbaarray #vbaarray #excelvbalesson-31 #computergyanguruji
Our second channel
Follow us on
instagram
Twitter
Facebook
MS Excel Videos
MS Excel for Beginners
Excel VBA
MS Word
MS PowerPoint
MS Access
MS Paint
MSW Logo
Notepad & HTML
CSS
Computer Education
Other
Tally
Internet
Computer GK
Google Sheet
Reasoning
Airthmatics
Рекомендации по теме
Комментарии
Автор

SIR KINDLY MAKE A VIDEO OF VBA SCRIPTING DICTIONARY AND FIND THE UNIQUE ROW WHICH ARE COPY TO OTHER EXCEL SHEET SAME ROW NOT COPY

MUHAMMADRIZWAN-mj
Автор

sir Using other episode I have tried to make it dynamic Option Explicit
Option Base 1
Sub array2()
Dim arr() As String
Sheets("ordinary").Select
Dim x As Long, y As Long, lr As Long, ur As Long, ar As Long, p As Long
lr =
For x = 1 To lr
If Range("a" & x).Value <> "" Then
Range("a" & x).Offset(1, 0).Select
Exit For
Else
End If
Next x
ur = Selection.Row - 1
ar = lr - ur + 1
ReDim arr(ar)
p = 1
For y = ur To lr
arr(p) = Range("a" & y).Value
p = p + 1
Next y
End Sub

amadersadhana
Автор

stores values that not starts from first row and has atleast 2 values, msgbox values onto screen
Sub dynamitearray()
Dim fr As Long, lr As Long, store As String
Range("A1").Select
Selection.End(xlDown).Select
fr = ActiveCell.Row
Selection.End(xlDown).Select
lr = ActiveCell.Row
ReDim Val(lr - fr + 1) As String
Dim i As Integer, j As Integer
i = 1
For j = fr To lr
Val(i) = Cells(j, 1).Value
store = store & " " & Val(i)
i = i + 1

Next j
MsgBox store

End Sub

kuntlasaikumar
Автор

14:08
sir aap khud hi confuse ho.
7-2=3 kese hoga😂
vo x ki value x=3 to 7 mese jo first wala 3 hai vo hai.
kya sir itna kyo confuse hore ho.
apse hi to hume hosla milta hai seekhna ka.
aap hi confuse rhoge to kese chlega

vijaykaushik