Quantcast
Channel: VBForums - Visual Basic 6 and Earlier
Viewing all 21126 articles
Browse latest View live

String manipulation (InStr)

$
0
0
Hi everybody, I need help.

I'd like get each displayed numbers to be in a variable like this :

var1 = 1

var2 = 2

var3 = 3...


Below is my function, it's working perfectly displaying the twelve numbers in the Debug Window but I'd like to be able to do as explained above.


Code:

Sub PrintWords(stInput As String)

Dim inCounter As Integer
Dim inFoundPos As Integer
Const PARSECHAR = "," 'Space

'If string is blank then do nothing
If Len(stInput) = 0 Then Exit Sub

'Start at the first character
inCounter = 1

'Search for a space
inFoundPos = InStr(inCounter, stInput, PARSECHAR)

'If a space is found print the word and keep searching
While inFoundPos <> 0
Debug.Print Mid$(stInput, inCounter, inFoundPos - inCounter)
inCounter = inFoundPos + 1
inFoundPos = InStr(inCounter, stInput, PARSECHAR)
Wend

'Print the remainder of the string
If inCounter < Len(stInput) Then
Debug.Print Mid$(stInput, inCounter)
End If

End Sub



Code:

Private Sub Command1_Click()

PrintWords ("1,2,3,4,5,6,7,8,9,10,11,12")

End Sub



Thanks in advance!

[RESOLVED] Variable type?

$
0
0
Hey. I'm trying to create a function which basically moves something on my form. This object will not not always be the same thing, sometimes a character, sometimes a box etc.

Code:

Dim ObjectToBeMoved as Object

(Doubt this is the right way. I'm basically
trying to declare a variable which can be
just about anything, if that makes any sense)


I have made Character() into a type with .left and .top properties, and same with Box().

So before this function executes I want to specify which object I'm about to move, but I can't make it work.

Code:

Set ObjectToBeMoved = Character(x)
Doesn't work.

Code:

Private Function MoveObject(ObjectToBeMoved as Object)
    .left = 50
    .top = 50
End Function

I want to call this with something like:

Code:

Call MoveObject(ObjectToBeMoved)

Sorry if I'm hard to understand. :P

Using LaVolpe to create an analog clock

$
0
0
Hello!

I would like to draw an analog clock onto a c32bppdib.

There is a really good example here:
http://planet-source-code.com/vb/scr...61901&lngWId=1

However, I am not sure where exactely I should start.

I do want to draw onto a c32bppdib because I simply love it, I can do things so quickly and conviniently with it.

I am just wondering how I should do the drawing.
At first I thought that I should use LaVolpe's cWordArt class, but then again it looked like too much fiddeling around for the relatively simple geometry I have to paint.

Does anybody have any suggestions?

Thank you!

Help file problem

$
0
0
Hi,

I'm working on a project with a small help file. Inside my development computer the chm help file works as it should. When I install the software on another computer it does not display while other programs I've developed the help file displays just fine on the other computer.

This is the declaration:
Code:

Private Declare Function HTMLHelp Lib "hhctrl.ocx" Alias "HtmlHelpA" _
        (ByVal hwnd As Long, ByVal lphelpfile As String, ByVal wCommand As Long, _
        dwData As Any) As Long

The declare function is in the (General) (Declarations) Option Explicit.

This is the mnuHelp routine:
Code:

Private Sub mnuHelp_Click()
   
    Call HTMLHelp(frmPTT.hwnd, App.HelpFile, &HF, ByVal CLng(10))

End Sub

And the Menu Editor:
Name:  Menu Editor.png
Views: 27
Size:  9.2 KB
Any ideas?
Attached Images
 

vb6 app and apache cassandra

$
0
0
Good day. How do you connect vb6 app to apache cassandra database?

Runtime 6 Overflow

$
0
0
Hi

Please could someone please help me with my code below. this project uses a USB-IO (Digital in/outputs), 1st thing that happens timer1 code is used to send an output0 signal to say VB program is ready using timer6 and also wait for input from a PLC when this input happens, it triggers timer2 that reads a text file from a third party software then outputs that data from the file to a RFID Tag via rs232, then timer3 is trigged to send output1 to say that process has complete. then timer 4 is trigged to turn of the output1 signal to say complete. The problem I have I keep getting runtime error 6 overflow where ever this line appears in the code "portDatas(0) = portDatas(0) - 2 ^ 1" or "portDatas(0) = portDatas(0) + 2 ^ 1", also I would like if there is any runtime errors timer7 is used switched of the signal because sometimes if and runtime occurs the signal could stay on then it would be giving force output to say VB is ready still but its not. that's why I tried using timer7 to turn off output0 so between timer6 and timer7 it turns output0 signal on / off 1 sec intervals but I keep getting runtime error 6 overflow then the PLC can monitor it turn off and on.


Code:

Option Explicit
Private intCount1 As Integer
Private intCount2 As Integer
Private Const startPort As Integer = 0
Private Const portCountShow As Integer = 4
Private portDatas(3) As Byte
Dim InBuff As String

Private Sub Command1_Click()
 Timer5.Enabled = True
 intCount1 = 0
End Sub

Private Sub MSComm1_OnComm()
        ' Dim InBuff As String
        ' Dim OutBuff As String

        Select Case MSComm1.CommEvent
        ' Handle each event or error by placing
        ' code below each case statement.

        ' This template is found in the Example
        ' section of the OnComm event Help topic
        ' in VB Help.

        ' Errors
            Case comEventBreak  ' A Break was received.
            Case comEventCDTO    ' CD (RLSD) Timeout.
            Case comEventCTSTO  ' CTS Timeout.
            Case comEventDSRTO  ' DSR Timeout.
            Case comEventFrame  ' Framing Error.
            Case comEventOverrun ' Data Lost.
            Case comEventRxOver  ' Receive buffer overflow.
            Case comEventRxParity  ' Parity Error.
            Case comEventTxFull  ' Transmit buffer full.
            Case comEventDCB    ' Unexpected error retrieving DCB]

        ' Events
            Case comEvCD  ' Change in the CD line.
            Case comEvCTS  ' Change in the CTS line.
            Case comEvDSR  ' Change in the DSR line.
            Case comEvRing ' Change in the Ring Indicator.
            Case comEvReceive ' Received RThreshold # of chars.
              InBuff = MSComm1.Input
              'OutBuff = MSComm1.Output
              Call HandleInput(InBuff)
            Case comEvSend ' There are SThreshold number of
                          ' characters in the transmit buffer.
            Case comEvEOF  ' An EOF character was found in the
                          ' input stream.
        End Select

      End Sub

      Sub HandleInput(InBuff As String)
        ' This is where you will process your input. This
        ' includes trapping characters, parsing strings,
        ' separating data fields, etc. For this case, you
        ' are simply going to display the data in the TextBox.
        Text1.SelStart = Len(Text1.Text)
        Text1.SelText = InBuff
      End Sub

Private Sub HandleError(ByVal err As ErrorCode)
    Dim utility As BDaqUtility
    Dim errorMessage As String
    Dim res As ErrorCode
       
    Set utility = New BDaqUtility
       
    res = utility.EnumToString("ErrorCode", err, errorMessage)
   
    If err <> Success Then
        MsgBox "Sorry ! There're some errors happened, the error code is: " & errorMessage, , "StaticDI"
    End If
End Sub

Private Function ReadFile(ByVal strFile As String) As String
    Dim intFN As Integer
    Dim strIN As String
    On Error GoTo FileReadingError
    intFN = FreeFile
    Open strFile For Input As #intFN
    strIN = Input(LOF(intFN), intFN)
    Close #intFN
    ReadFile = strIN
    Exit Function
FileReadingError:
    Close #intFN
    MsgBox "File input error!"
    ReadFile = vbNullString
End Function



Private Sub InitializePortState()
    On Error GoTo 0
    Dim portData As Byte
    portData = 0
    Dim portDir As Byte
    portDir = &HFF
    Dim err As ErrorCode
    err = Success
    Dim portDirs() As IPortDirection

    Dim i As Integer
    i = 0
    While (i + startPort) < InstantDoCtrl1.Features.PortCount And i < portCountShow
        err = InstantDoCtrl1.ReadPort(i + startPort, portData)
        If err <> Success Then
            HandleError (err)
            Exit Sub
        End If
       
        PortNum.Item(i).Caption = Str(i + startPort)
        PortHex.Item(i).Caption = Format(Hex(portData), "00")
        portDatas(i) = portData
       
        'set the port direction
        If InstantDoCtrl1.Features.PortProgrammable Then
            portDirs = InstantDoCtrl1.PortDirection
            portDir = portDirs(i).Direction
        End If
       
        'Set image state
        Dim j As Integer
        Dim Index As Integer
        For j = 0 To 7
            Index = (Int(portData / 2 ^ j) And &H1) + 1
            If i = 0 Then
                If (Int(portDir / 2 ^ j) And &H1) = 0 Then  'Bit direction is input.
                    Image0.Item(j).Picture = ImageList1.ListImages(3).Picture
                Else
                    Image0.Item(j).Picture = ImageList1.ListImages(Index).Picture
                    Image0.Item(j).Tag = (Int(portData / 2 ^ j) And &H1)
                    Image0.Item(j).Enabled = True
                End If
            End If

            If i = 1 Then
                If (Int(portDir / 2 ^ j) And &H1) = 0 Then  'Bit direction is input.
                    Image1.Item(j).Picture = ImageList1.ListImages(3).Picture
                Else
                    Image1.Item(j).Picture = ImageList1.ListImages(Index).Picture
                    Image1.Item(j).Tag = (Int(portData / 2 ^ j) And &H1)
                    Image1.Item(j).Enabled = True
                End If
            End If
               
            If i = 2 Then
                If (Int(portDir / 2 ^ j) And &H1) = 0 Then  'Bit direction is input.
                    Image2.Item(j).Picture = ImageList1.ListImages(3).Picture
                Else
                    Image2.Item(j).Picture = ImageList1.ListImages(Index).Picture
                    Image2.Item(j).Tag = (Int(portData / 2 ^ j) And &H1)
                    Image2.Item(j).Enabled = True
                End If
            End If

            If i = 3 Then
                If (Int(portDir / 2 ^ j) And &H1) = 0 Then  'Bit direction is input.
                    Image3.Item(j).Picture = ImageList1.ListImages(3).Picture
                Else
                    Image3.Item(j).Picture = ImageList1.ListImages(Index).Picture
                    Image3.Item(j).Tag = (Int(portData / 2 ^ j) And &H1)
                    Image3.Item(j).Enabled = True
                End If
            End If
        Next j
           
        i = i + 1

    Wend
End Sub

Private Sub Form_Load()
    'The default device of project is demo device, users can choose other devices according to their needs.
    If Not InstantDoCtrl1.Initialized Then
        MsgBox "Please select a device with DAQNavi wizard!", , "StaticDO"
        End
    End If
   
    'set the title of the form.
    Dim devNum As Long
    Dim devDesc As String
    Dim devMode As AccessMode
    Dim modIndex As Long
    InstantDoCtrl1.getSelectedDevice devNum, devDesc, devMode, modIndex
    StaticDO.Caption = "Static DO(" + devDesc + ")"
  '  StaticDI.Caption = "Static DI(" + devDesc + ")"
    InitializePortState
     
  Dim bitValue As Integer
    bitValue = Val(Image0.Item(1).Tag)
    If bitValue = 1 Then
 
        portDatas(0) = portDatas(0) - 2 ^ 1
       
    End If
   
    PortHex.Item(0).Caption = Format(Hex(portDatas(0)), "00")
    Dim err As ErrorCode
    err = Success
    err = InstantDoCtrl1.WritePort(0 + startPort, portDatas(0))
    If err <> Success Then
        HandleError (err)
    End If

   
    'enable the timer to read DI ports status
    Timer1.Enabled = True
      Timer6.Enabled = True
    '  Form1.Caption = "App2"
        With MSComm1
            .CommPort = 1
            .Handshaking = 2 - comRTS
            .RThreshold = 1
            .RTSEnable = True
            .Settings = "9600,e,8,1"
            .SThreshold = 1
            .PortOpen = True
            ' Leave all other settings as default values.
        End With
   
   
   
End Sub

Private Sub Image0_Click(Index As Integer)
    Dim bitValue As Integer
    bitValue = Val(Image0.Item(Index).Tag)
    If bitValue = 0 Then
        portDatas(0) = portDatas(0) + 2 ^ Index
        Image0.Item(Index).Picture = ImageList1.ListImages(2).Picture
        Image0.Item(Index).Tag = 1
    ElseIf bitValue = 1 Then
        portDatas(0) = portDatas(0) - 2 ^ Index
        Image0.Item(Index).Picture = ImageList1.ListImages(1).Picture
        Image0.Item(Index).Tag = 0
    End If
   
    PortHex.Item(0).Caption = Format(Hex(portDatas(0)), "00")
    Dim err As ErrorCode
    err = Success
    err = InstantDoCtrl1.WritePort(0 + startPort, portDatas(0))
    If err <> Success Then
        HandleError (err)
    End If
End Sub

Private Sub Image1_Click(Index As Integer)
    Dim bitValue As Integer
    bitValue = Val(Image1.Item(Index).Tag)
    If bitValue = 0 Then
        portDatas(1) = portDatas(1) + 2 ^ Index
        Image1.Item(Index).Picture = ImageList1.ListImages(2).Picture
        Image1.Item(Index).Tag = 1
    ElseIf bitValue = 1 Then
        portDatas(1) = portDatas(1) - 2 ^ Index
        Image1.Item(Index).Picture = ImageList1.ListImages(1).Picture
        Image1.Item(Index).Tag = 0
    End If
   
    PortHex.Item(1).Caption = Format(Hex(portDatas(1)), "00")
    Dim err As ErrorCode
    err = Success
    err = InstantDoCtrl1.WritePort(1 + startPort, portDatas(1))
    If err <> Success Then
        HandleError (err)
    End If
End Sub


Private Sub InstantDoCtrl2_DeviceRemoved()

End Sub
Private Sub Timer1_Timer()
    'read Di port state
    Dim err As ErrorCode
    err = Success
    Dim portData As Byte
   
    Dim i As Integer
    i = 0
    While (i + startPort) < InstantDiCtrl1.Features.PortCount And i < portCountShow
        portData = 0
        err = InstantDiCtrl1.ReadPort(i + startPort, portData)
        If err <> Success Then
            Timer1.Enabled = False
            HandleError (err)
            Exit Sub
        End If
       
        PortNum.Item(i).Caption = Str(i + startPort)
        PortHex.Item(i).Caption = Format(Hex(portData), "00")
       
        'Set image box state
        Dim j As Integer
        Dim Index As Integer
        For j = 0 To 7
            Index = (Int(portData / 2 ^ j) And 1) + 1
            If i = 0 Then
                Image0.Item(j).Picture = ImageList1.ListImages(Index).Picture
              If PortHex(0).Caption = "FD" Then
              Timer2.Enabled = True
              intCount2 = 0
            End If
            End If
           
            If i = 1 Then
                Image1.Item(j).Picture = ImageList1.ListImages(Index).Picture
            End If
           
            If i = 2 Then
                Image2.Item(j).Picture = ImageList1.ListImages(Index).Picture
            End If
           
            If i = 3 Then
                Image3.Item(j).Picture = ImageList1.ListImages(Index).Picture
            End If
        Next j
                       
        i = i + 1
    Wend
End Sub



Private Sub Timer2_Timer()
 Dim j As Long
    Dim l() As String
    Dim f() As String

  'DisableClose (Form1.hWnd) ' Disables close of Window.
 
    l = Split(ReadFile("c:\users\administrator\wers.txt"), vbNewLine)
   
    f = Split(l(0), ",") ' get the first line, you must do check to ensure l(0) contains valid inputs.
    Text2.Text = l(0)
  ' Text17.Text = l(1)
    'Text18.Text = l(2)
 '  Text19.Text = l(3)
  '  Text20.Text = l(4)
  ' Text21.Text = l(5)
    'Text22.Text = l(6)
    'Text23.Text = l(7)

   
    Select Case intCount2
        Case 0: MSComm1.Output = "P0147001210" & vbCr

        Case 1: Text1.SelText = InBuff

        Case 2: MSComm1.Output = Chr(2) & Text2.Text & Chr(13)
 
       
        Case 3: Timer2.Enabled = False
                Timer3.Enabled = True
   
   
    End Select
  intCount2 = intCount2 + 1
   
End Sub

Private Sub Timer3_Timer()

        portDatas(0) = portDatas(0) + 2 ^ 1
     
    Dim err As ErrorCode
    err = Success
    err = InstantDoCtrl1.WritePort(0 + startPort, portDatas(0))
    If err <> Success Then
        HandleError (err)
    End If
   
    Timer3.Enabled = False
    Timer4.Enabled = True
End Sub

Private Sub Timer4_Timer()

        portDatas(0) = portDatas(0) - 2 ^ 1
     
    Dim err As ErrorCode
    err = Success
    err = InstantDoCtrl1.WritePort(0 + startPort, portDatas(0))
    If err <> Success Then
        HandleError (err)
    End If
   
    Timer4.Enabled = False
End Sub

intCount1 = intCount1 + 1
End Sub

Private Sub Timer6_Timer()
Dim bitValue As Integer
    bitValue = Val(Image0.Item(1).Tag)
    If bitValue = 0 Then
        portDatas(0) = portDatas(0) + 2 ^ 0
   
       
    End If
   
 
    Dim err As ErrorCode
    err = Success
    err = InstantDoCtrl1.WritePort(0 + startPort, portDatas(0))
    If err <> Success Then
        HandleError (err)
       
    End If
 Timer7.Enabled = True
End Sub

Private Sub Timer7_Timer()
Dim bitValue As Integer
    bitValue = Val(Image0.Item(1).Tag)
    If bitValue = 1 Then
        portDatas(0) = portDatas(0) - 2 ^ 0
   
       
    End If
   
    PortHex.Item(0).Caption = Format(Hex(portDatas(0)), "00")
    Dim err As ErrorCode
    err = Success
    err = InstantDoCtrl1.WritePort(0 + startPort, portDatas(0))
    If err <> Success Then
        HandleError (err)
    End If
   
    Timer7.Enabled = False
End Sub

Thanks

Steve

RC5 SQLite Question - Attaching InMemory database by cConnection.Execute not working

$
0
0
When testing by SQlite command line, I can get the following results:


Name:  1.jpg
Views: 69
Size:  40.2 KB

While writing code in vb6 as below, I don't get the desired results by Executing an SQL. It's possible to do it by .AttachDataBase method though.

Code:

   

    Debug.Print cnn.DataBases.Count '1
    Debug.Print cnn.Execute("ATTACH DATABASE 'file:InMemDB1?mode=memory&cache=shared' AS InMemDB1")
    Debug.Print cnn.DataBases.Count '1
    cnn.DataBases.AttachDataBase "file:InMemDB2?mode=memory&cache=shared", "InMemDB2"
    Debug.Print cnn.DataBases.Count '2

The assumption is that .Execute should work the same way as I play in the command line tool?
Attached Images
 

Multidimensional control arrays at design?

$
0
0
Is it possible to create multidimensional control arrays at design? I have come to the assumption that the answer is no.
I know how to re-dim and create them at runtime etc, but it's pretty inconvient for the particular stuff I'm working on atm.

In this particular case I want to create source pictures for a walking animation.

Code:

picCharacterWalk(FaceDirection,StepAnimation)
If I resort to arranging this at run-time, it adds a lot of extra code (like loading each individual picturebox with the corresponding c:\bmp)

I need to have them in pictureboxes for reasons I shall not go into here.

Running total in VBA excel

$
0
0
I have a peculiar situation in excel VBA code. I have a total row in excel sheet. However, it neither says the word "total" nor does the cell has any formula. There are 10 "total" cells, one for each column. I need to loop through the column and find the total cell (by checking if the value for each cell matches the sum of previous cells and then delete that row. All the "total" cells are in the same row. any help please?

Query

$
0
0
Hi

I have 1 table with 2 fields . Field A can have duplicates but i want if Field A has different values in Field b then that Field A records should not be returned.

Thanks

Read Xml attribute

$
0
0
Hi,

Please can anyone help with the following?

I'm trying to read the 'Seat' attribute in the following xml file...

<?xml version="1.0" encoding="UTF-8"?>
-<Votes>
<Vote Time="14600" Seat="2001">1</Vote>
<Vote Time="12500" Seat="2002">1</Vote>
<Vote Time="10400" Seat="2003">3</Vote>
<Vote Time="7250" Seat="2004">4</Vote>
<Vote Time="3600" Seat="2005">2</Vote>
</Votes>

Using the following code I'm able to get the Node value, but I can't figure out the attribute.

Private Sub Command1_Click()

Dim oXMLDocument As New MSXML2.DOMDocument60
Dim oDocElement As MSXML2.IXMLDOMElement
Dim oNode As IXMLDOMNode
Dim fNode As IXMLDOMNode
Dim strPath as String

strPath = "C:\Users\J\Desktop\votes.xml"

oXMLDocument.Load strPath
Set oDocElement = oXMLDocument.documentElement

For Each oNode In oDocElement.childNodes
For Each fNode In oNode.childNodes
'
'
Debug.Print fNode.Text

Next
Next
End Sub

This is the result I would like...

2001 1
2002 1
2003 3
2004 4
2005 2

Thank you.

Overdrawn Listview: Get Checkbox Rectangle

$
0
0
What's the best way to achieve this..since LVIR_Flags (LVIR_BOUNDS might not return accurate rectangle results when ListView mode vary LVS_ICON/TILE or Report)
- lets say you toggle explorer theme to true...the LVIR_BOUNDS will cover the icon and label then all is ok...but when explorer theme is false...what happens to the LVIR_BOUNDS..is thrown out of the picture..since the only highlight will be the label (if it's there).

LucasMKG
I'm back

Compile vb6 .exe compatible cad 2013-2015

$
0
0
Hello folks. Are there any way we can compile our .exe file that can use both 2013 & 2015 autocad libraries?

In general can we compile our code which can recognize more than 1 version of autocad libraries in case they tweak or change some of library attributes?

Thanks,

[RESOLVED] Leave some space between words

$
0
0
Hi experts
I'm copying items from one listview to another listview on a second form
This i the code:

Code:

Dim itmX As ListItem
Dim intI As Integer
For intI = 1 To lvw.ListItems.count
 If lvw.ListItems.Item(intI).Selected = True Then
Set itmX = form5.lvw.ListItems.Add(, , lvw.SelectedItem)
   
  ' itmX.SubItems(1) = Form1.ListView1.ListItems(intI).SubItems(1)
    End If
    Next
  form5.lvw.Refresh

What I'm looking for is: Once the items are copied to the other listview I want to leave some space between words.
If this is not possible, is it possible to populate the first listview from access table with adding some space between words.
This is how I'm feeding my first listview.

Code:

Dim Lst As ListItem
  lvw.View = lvwReport
Do While Not RS.EOF
Set Lst = lvw.ListItems.Add(, , RS!mod_name & "")
RS.MoveNext
Loop

To illutrate:
In the table the record is:
visual basic 6
On the litview, I want:
visual . . . . basic . . . . . 6
I put points instead of space because when I previewed my message I figured out that the space is not taken into account after submitting the thread.
Thank a lot

A problem with Web Elements

$
0
0
Hello guys, I have a login page in my website. I'm developing a login program.

Code:

For Each obj In WebBrowser1.Document.GetElementsByTagName("input")
            If (obj.GetAttribute("name") = "email") Then
                obj.Value = Text1.Text
            End If
            Next

I'm writing my textbox(username) to login website e-mail area and..

Code:

For Each obj In WebBrowser1.Document.GetElementsByTagName("button")
            If (obj.GetAttribute("submit") = "login") Then
                obj.click
            End If
            Next

I'm sending login request. There is not a problem my textbox appear to web but when I click submit button textbox like dissapear like as no writen as..

Name:  1.png
Views: 50
Size:  3.7 KBName:  2.png
Views: 43
Size:  766 Bytes

So I can't log in. How can I transfer correctly?

***There is html of login text;

Code:

<input class="abc" aria-describedby="" aria-label="E-mail" aria-required="true" autocapitalize="off" autocorrect="off" name="email" placeholder="E-mail" value="" type="text" data-reactid=".0.1.0.1.0.1.0.3.0">
Attached Images
  

WebkitBrowser update

$
0
0
Hello!

I am using Olaf Schmidt's great WebkitBrowser since some years, but now I need an update because my user can't access Facebook.
It seems that the WebkitBrowser doesn't accept cookies.
I've spent much time on making it work, trying out all kinds of privacy settings, but none of them would work.

Does anybody know if the control is going to be updated any more?

Thank you.

Line of sight

$
0
0
Hey. I'm currently working on implementing LOS in my game. I'm using Bresenham's line algorithm to basically send out a pixelized line from the center of my character to the center of each square within my characters crossbow range in this case, and if the line hits an object on its trajectory the target square gets an invalidation flag "not in range (I've only objectified the pillar at this point, as you can see on the image).



However, this turns out to be kinda tricky on an isometric grid, and I haven't even started messing with altitude yet.

What about doing the LOS calculations on a flat "normal" 2d grid instead where everything is more symmetrical? And is this method even recommended to begin with?


Edit: I just realized this is perhaps the wrong forum for this type of question. If you want to move it to the games section, feel free.

[RESOLVED] Compile vb6 .exe compatible cad 2013-2015

$
0
0
Hello folks. Are there any way we can compile our .exe file that can use both 2013 & 2015 autocad libraries?

In general can we compile our code which can recognize more than 1 version of autocad libraries in case they tweak or change some of library attributes?

Thanks,

Problem with ScinCrafter

$
0
0
Hiiii VBForums
Hiii evey one
Please masters if you can help me to resolve this problem
In my project I have form1 and form2
I put a code to display SkinCrafter in Form1 only
But unfortunately this ScinCrafter appears also in Form2 ..whereas I want to show this ScinCrafter only in form1
Thank you in advance for help me
Cordially
MADA
Skin in Form1 only.zip
Name:  1.jpg
Views: 94
Size:  20.5 KB
Attached Images
 
Attached Files

VB6 RichTextBox Line Numbers

$
0
0
Hi All! I've been looking a long time for a way to add line numbers to the left margin of a VB6 RTF with no luck:( It seems to me that if you can add a bullet image in the left indent margin, one should be able
either change the bullet image or add a new image to the margin (rtf_3ind.bmp)? Is there a way to insert an image into the left margin?

Thanks!

Donald.
Viewing all 21126 articles
Browse latest View live


<script src="https://jsc.adskeeper.com/r/s/rssing.com.1596347.js" async> </script>